Supermercados

Importar librerias

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats   1.0.0     ✔ readr     2.1.4
## ✔ ggplot2   3.4.1     ✔ stringr   1.5.0
## ✔ lubridate 1.9.2     ✔ tibble    3.1.8
## ✔ purrr     1.0.1     ✔ tidyr     1.3.0
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
## ℹ Use the ]8;;http://conflicted.r-lib.org/conflicted package]8;; to force all conflicts to become errors
library(janitor)
## 
## Attaching package: 'janitor'
## 
## The following objects are masked from 'package:stats':
## 
##     chisq.test, fisher.test
library(lubridate)

Importar base de datos

bdsuper <- read.csv("/Users/marcelotam/Desktop/manipulacion de datos/supermercado.csv")

Entender la base de datos

summary(bdsuper)
##     BillNo            Itemname            Quantity            Date          
##  Length:522064      Length:522064      Min.   :-9600.00   Length:522064     
##  Class :character   Class :character   1st Qu.:    1.00   Class :character  
##  Mode  :character   Mode  :character   Median :    3.00   Mode  :character  
##                                        Mean   :   10.09                     
##                                        3rd Qu.:   10.00                     
##                                        Max.   :80995.00                     
##                                                                             
##      Price              CustomerID       Country         
##  Min.   :-11062.060   Min.   :12346    Length:522064     
##  1st Qu.:     1.250   1st Qu.:13950    Class :character  
##  Median :     2.080   Median :15265    Mode  :character  
##  Mean   :     3.827   Mean   :15317                      
##  3rd Qu.:     4.130   3rd Qu.:16837                      
##  Max.   : 13541.330   Max.   :18287                      
##                       NA's   :134041
#count(bdsuper, BillNo, sort=TRUE)
#count(bdsuper, Itemname, sort=TRUE)
#count(bdsuper, Price, sort=TRUE)
#count(bdsuper, Date, sort=TRUE)
#count(bdsuper, Country, sort=TRUE)
#count(bdsuper, Producto, sort=TRUE)

tibble(bdsuper)
## # A tibble: 522,064 × 7
##    BillNo Itemname                           Quant…¹ Date  Price Custo…² Country
##    <chr>  <chr>                                <int> <chr> <dbl>   <int> <chr>  
##  1 536365 WHITE HANGING HEART T-LIGHT HOLDER       6 01/1…  2.55   17850 United…
##  2 536365 WHITE METAL LANTERN                      6 01/1…  3.39   17850 United…
##  3 536365 CREAM CUPID HEARTS COAT HANGER           8 01/1…  2.75   17850 United…
##  4 536365 KNITTED UNION FLAG HOT WATER BOTT…       6 01/1…  3.39   17850 United…
##  5 536365 RED WOOLLY HOTTIE WHITE HEART.           6 01/1…  3.39   17850 United…
##  6 536365 SET 7 BABUSHKA NESTING BOXES             2 01/1…  7.65   17850 United…
##  7 536365 GLASS STAR FROSTED T-LIGHT HOLDER        6 01/1…  4.25   17850 United…
##  8 536366 HAND WARMER UNION JACK                   6 01/1…  1.85   17850 United…
##  9 536366 HAND WARMER RED POLKA DOT                6 01/1…  1.85   17850 United…
## 10 536367 ASSORTED COLOUR BIRD ORNAMENT           32 01/1…  1.69   13047 United…
## # … with 522,054 more rows, and abbreviated variable names ¹​Quantity,
## #   ²​CustomerID
head(bdsuper, n=7)
##   BillNo                            Itemname Quantity          Date Price
## 1 536365  WHITE HANGING HEART T-LIGHT HOLDER        6 01/12/10 8:26  2.55
## 2 536365                 WHITE METAL LANTERN        6 01/12/10 8:26  3.39
## 3 536365      CREAM CUPID HEARTS COAT HANGER        8 01/12/10 8:26  2.75
## 4 536365 KNITTED UNION FLAG HOT WATER BOTTLE        6 01/12/10 8:26  3.39
## 5 536365      RED WOOLLY HOTTIE WHITE HEART.        6 01/12/10 8:26  3.39
## 6 536365        SET 7 BABUSHKA NESTING BOXES        2 01/12/10 8:26  7.65
## 7 536365   GLASS STAR FROSTED T-LIGHT HOLDER        6 01/12/10 8:26  4.25
##   CustomerID        Country
## 1      17850 United Kingdom
## 2      17850 United Kingdom
## 3      17850 United Kingdom
## 4      17850 United Kingdom
## 5      17850 United Kingdom
## 6      17850 United Kingdom
## 7      17850 United Kingdom
tail(bdsuper, n=7)
##        BillNo                        Itemname Quantity           Date Price
## 522058 581587              SPACEBOY LUNCH BOX       12 09/12/11 12:50  1.95
## 522059 581587      CHILDRENS CUTLERY SPACEBOY        4 09/12/11 12:50  4.15
## 522060 581587     PACK OF 20 SPACEBOY NAPKINS       12 09/12/11 12:50  0.85
## 522061 581587     CHILDREN'S APRON DOLLY GIRL        6 09/12/11 12:50  2.10
## 522062 581587    CHILDRENS CUTLERY DOLLY GIRL        4 09/12/11 12:50  4.15
## 522063 581587 CHILDRENS CUTLERY CIRCUS PARADE        4 09/12/11 12:50  4.15
## 522064 581587    BAKING SET 9 PIECE RETROSPOT        3 09/12/11 12:50  4.95
##        CustomerID Country
## 522058      12680  France
## 522059      12680  France
## 522060      12680  France
## 522061      12680  France
## 522062      12680  France
## 522063      12680  France
## 522064      12680  France
tabyl(bdsuper, Itemname, Country)
##                              Itemname Australia Austria Bahrain Belgium Brazil
##                                               0       0       0       0      0
##                                     ?         0       0       0       0      0
##                       ? sold as sets?         0       0       0       0      0
##                                    ??         0       0       0       0      0
##                            ?? missing         0       0       0       0      0
##                                   ???         0       0       0       0      0
##                       ????damages????         0       0       0       0      0
##                           ????missing         0       0       0       0      0
##                               ???lost         0       0       0       0      0
##                            ???missing         0       0       0       0      0
##                             ?display?         0       0       0       0      0
##                                 ?lost         0       0       0       0      0
##                              ?missing         0       0       0       0      0
##                        ?sold as sets?         0       0       0       0      0
##                 *Boombox Ipod Classic         0       0       0       0      0
##               *USB Office Mirror Ball         0       0       0       0      0
##                10 COLOUR SPACEBOY PEN         1       0       0       0      0
##            12 COLOURED PARTY BALLOONS         0       0       0       1      0
##             12 DAISY PEGS IN WOOD BOX         0       0       0       0      0
##             12 EGG HOUSE PAINTED WOOD         0       0       0       0      0
##          12 HANGING EGGS HAND PAINTED         0       0       0       0      0
##      12 IVORY ROSE PEG PLACE SETTINGS         0       0       0       0      0
##       12 MESSAGE CARDS WITH ENVELOPES         0       0       0       0      0
##         12 PENCIL SMALL TUBE WOODLAND         1       0       0       1      0
##   12 PENCILS SMALL TUBE RED RETROSPOT         0       1       0       1      0
##           12 PENCILS SMALL TUBE SKULL         0       1       0       1      0
##             12 PENCILS TALL TUBE POSY         2       0       0       0      0
##    12 PENCILS TALL TUBE RED RETROSPOT         1       0       0       1      0
##           12 PENCILS TALL TUBE SKULLS         0       0       0       0      0
##         12 PENCILS TALL TUBE WOODLAND         0       0       0       2      0
##          12 PINK HEN+CHICKS IN BASKET         0       0       0       0      0
##       12 PINK ROSE PEG PLACE SETTINGS         0       0       0       0      0
##        12 RED ROSE PEG PLACE SETTINGS         0       0       0       0      0
##          15 PINK FLUFFY CHICKS IN BOX         0       0       0       0      0
##   15CM CHRISTMAS GLASS BALL 20 LIGHTS         0       0       0       0      0
##       16 PC CUTLERY SET PANTRY DESIGN         0       0       0       0      0
##    16 PIECE CUTLERY SET PANTRY DESIGN         1       0       0       0      0
##    18PC WOODEN CUTLERY SET DISPOSABLE         0       0       0       0      0
##                   2 DAISIES HAIR COMB         0       0       0       0      0
##      2 PICTURE BOOK EGGS EASTER BUNNY         0       0       0       0      0
##     2 PICTURE BOOK EGGS EASTER CHICKS         0       0       0       0      0
##      2 PICTURE BOOK EGGS EASTER DUCKS         0       0       0       0      0
##               20 DOLLY PEGS RETROSPOT         1       0       0       0      0
##                200 BENDY SKULL STRAWS         0       0       0       1      0
##          200 RED + WHITE BENDY STRAWS         0       0       0       1      0
##                  20713 wrongly marked         0       0       0       0      0
##                 3 BIRDS CANVAS SCREEN         0       0       0       0      0
##      3 BLACK CATS W HEARTS BLANK CARD         0       0       0       0      0
##   3 DRAWER ANTIQUE WHITE WOOD CABINET         0       0       0       0      0
##       3 GARDENIA MORRIS BOXED CANDLES         0       0       0       0      0
##    3 HEARTS HANGING DECORATION RUSTIC         0       0       0       0      0
##            3 HOOK HANGER MAGIC GARDEN         1       0       0       0      0
##      3 HOOK PHOTO SHELF ANTIQUE WHITE         0       0       0       0      0
##    3 PIECE SPACEBOY COOKIE CUTTER SET         0       1       0       1      0
##           3 PINK HEN+CHICKS IN BASKET         0       0       0       0      0
##       3 RAFFIA RIBBONS 50'S CHRISTMAS         0       0       0       0      0
##    3 RAFFIA RIBBONS VINTAGE CHRISTMAS         0       0       0       0      0
##           3 ROSE MORRIS BOXED CANDLES         0       0       0       0      0
##              3 STRIPEY MICE FELTCRAFT         3       0       0       0      0
##       3 TIER CAKE TIN GREEN AND CREAM         1       0       0       0      0
##         3 TIER CAKE TIN RED AND CREAM         2       0       0       1      0
##        3 TIER SWEETHEART GARDEN SHELF         0       0       0       0      0
##    3 TRADITIONAl BISCUIT CUTTERS  SET         0       0       0       3      0
##     3 TRADITIONAL COOKIE CUTTERS  SET         0       0       0       0      0
##     3 WHITE CHOC MORRIS BOXED CANDLES         0       0       0       0      0
##         3 WICK CHRISTMAS BRIAR CANDLE         0       0       0       0      0
##                 36 DOILIES DOLLY GIRL         0       0       0       1      0
##          36 DOILIES VINTAGE CHRISTMAS         1       0       0       0      0
##              36 FOIL HEART CAKE CASES         0       1       0       1      0
##               36 FOIL STAR CAKE CASES         0       1       0       1      0
##                  36 PENCILS TUBE POSY         0       0       0       0      0
##         36 PENCILS TUBE RED RETROSPOT         4       0       0       4      0
##                36 PENCILS TUBE SKULLS         1       1       0       1      0
##              36 PENCILS TUBE WOODLAND         0       0       0       3      0
##          3D CHRISTMAS STAMPS STICKERS         0       0       0       0      0
##          3D DOG PICTURE PLAYING CARDS         0       0       0       0      0
##    3D HEARTS  HONEYCOMB PAPER GARLAND         0       0       0       0      0
##              3D SHEET OF CAT STICKERS         0       0       0       0      0
##              3D SHEET OF DOG STICKERS         0       0       0       0      0
##     3D TRADITIONAL CHRISTMAS STICKERS         0       1       0       0      0
##         3D VINTAGE CHRISTMAS STICKERS         0       1       0       0      0
##    4 BLUE DINNER CANDLES SILVER FLOCK         0       0       0       0      0
##        4 BURGUNDY WINE DINNER CANDLES         0       0       0       0      0
##          4 GOLD FLOCK CHRISTMAS BALLS         0       0       0       0      0
##   4 IVORY DINNER CANDLES SILVER FLOCK         0       0       0       0      0
##   4 LAVENDER BOTANICAL DINNER CANDLES         0       0       0       0      0
##      4 LILY  BOTANICAL DINNER CANDLES         0       0       0       0      0
##       4 PEAR BOTANICAL DINNER CANDLES         0       0       0       0      0
##     4 PINK DINNER CANDLE SILVER FLOCK         0       0       0       0      0
##          4 PINK FLOCK CHRISTMAS BALLS         0       0       0       0      0
##         4 PURPLE FLOCK DINNER CANDLES         0       0       0       0      0
##            4 ROSE PINK DINNER CANDLES         0       0       0       0      0
##             4 SKY BLUE DINNER CANDLES         0       0       0       0      0
##           4 TRADITIONAL SPINNING TOPS         5       0       0       2      0
##           4 VANILLA BOTANICAL CANDLES         0       0       0       0      0
##        4 WILDFLOWER BOTANICAL CANDLES         0       0       0       0      0
##         5 HOOK HANGER MAGIC TOADSTOOL         0       0       0       0      0
##     5 HOOK HANGER RED MAGIC TOADSTOOL         0       0       0       0      0
##         5 STRAND GLASS NECKLACE AMBER         0       0       0       0      0
##      5 STRAND GLASS NECKLACE AMETHYST         0       0       0       0      0
##         5 STRAND GLASS NECKLACE BLACK         0       0       0       0      0
##       5 STRAND GLASS NECKLACE CRYSTAL         0       0       0       0      0
##         50'S CHRISTMAS GIFT BAG LARGE         0       0       0       0      0
##         50'S CHRISTMAS PAPER GIFT BAG         0       0       0       0      0
##       50CM METAL STRING WITH  7 CLIPS         0       0       0       0      0
##       6 CHOCOLATE LOVE HEART T-LIGHTS         0       0       0       0      0
##              6 EGG HOUSE PAINTED WOOD         0       0       0       0      0
##            6 GIFT TAGS 50'S CHRISTMAS         0       1       0       1      0
##         6 GIFT TAGS VINTAGE CHRISTMAS         1       2       0       2      0
##           6 RIBBONS ELEGANT CHRISTMAS         0       0       0       0      0
##                      6 RIBBONS EMPIRE         0       0       0       0      0
##                6 RIBBONS RUSTIC CHARM         1       2       0       2      0
##            6 RIBBONS SHIMMERING PINKS         0       0       0       0      0
##                     6 ROCKET BALLOONS         0       0       0       0      0
##       60 CAKE CASES DOLLY GIRL DESIGN         0       0       0       9      0
##       60 CAKE CASES VINTAGE CHRISTMAS         1       0       0       1      0
##   60 GOLD AND SILVER FAIRY CAKE CASES         0       0       0       0      0
##           60 TEATIME FAIRY CAKE CASES         0       0       0       4      0
##         6PC WOOD PLATE SET DISPOSABLE         0       0       0       0      0
##                70'S ALPHABET WALL ART         1       0       0       0      0
##       72 CAKE CASES VINTAGE CHRISTMAS         0       0       0       0      0
##        72 SWEETHEART FAIRY CAKE CASES         1       1       0       3      0
##             75 BLACK PETIT FOUR CASES         0       0       0       0      0
##             75 GREEN FAIRY CAKE CASES         0       0       0       0      0
##             75 GREEN PETIT FOUR CASES         0       0       0       0      0
##               A PRETTY THANK YOU CARD         0       0       0       0      0
##              A4 WALL TIDY BLUE OFFICE         0       0       0       0      0
##              A4 WALL TIDY RED FLOWERS         0       0       0       0      0
##                 ABC TREASURE BOOK BOX         2       0       0       3      0
##               ABSTRACT CIRCLE JOURNAL         0       0       0       1      0
##          ABSTRACT CIRCLES POCKET BOOK         0       0       0       0      0
##           ABSTRACT CIRCLES SKETCHBOOK         0       0       0       2      0
##                ACRYLIC GEOMETRIC LAMP         0       0       0       0      0
##            ACRYLIC HANGING JEWEL,BLUE         0       0       0       0      0
##            ACRYLIC HANGING JEWEL,PINK         0       0       0       0      0
##              ACRYLIC JEWEL ANGEL,PINK         0       0       0       0      0
##            ACRYLIC JEWEL ICICLE, BLUE         0       0       0       0      0
##            ACRYLIC JEWEL ICICLE, PINK         0       0       0       0      0
##         ACRYLIC JEWEL SNOWFLAKE, PINK         0       0       0       0      0
##          ACRYLIC JEWEL SNOWFLAKE,PINK         0       0       0       0      0
##   add stock to allocate online orders         0       0       0       0      0
##                                adjust         0       0       0       0      0
##                       Adjust bad debt         0       0       0       0      0
##                            adjustment         0       0       0       0      0
##                            Adjustment         0       0       0       0      0
##             ADULT APRON APPLE DELIGHT         0       0       0       0      0
##          ADVENT CALENDAR GINGHAM SACK         2       1       0       1      0
##              AFGHAN SLIPPER SOCK PAIR         0       0       0       0      0
##      AGED GLASS SILVER T-LIGHT HOLDER         0       0       0       0      0
##     AIRLINE BAG VINTAGE JET SET BROWN         0       0       0       2      0
##       AIRLINE BAG VINTAGE JET SET RED         0       0       0       5      0
##     AIRLINE BAG VINTAGE JET SET WHITE         0       0       0       3      0
##          AIRLINE BAG VINTAGE TOKYO 78         0       0       0       1      0
##    AIRLINE BAG VINTAGE WORLD CHAMPION         0       0       0       1      0
##             AIRLINE LOUNGE,METAL SIGN         0       0       0       0      0
##   alan hodge cant mamage this section         0       0       0       0      0
##        ALARM CLOCK BAKELIKE CHOCOLATE         1       0       0       5      0
##            ALARM CLOCK BAKELIKE GREEN         6       0       0      12      0
##            ALARM CLOCK BAKELIKE IVORY         4       0       0       2      0
##           ALARM CLOCK BAKELIKE ORANGE         2       0       0       6      0
##             ALARM CLOCK BAKELIKE PINK         3       0       0       9      0
##              ALARM CLOCK BAKELIKE RED         6       0       0      13      0
##   allocate stock for dotcom orders ta         0       0       0       0      0
##         ALPHABET HEARTS STICKER SHEET         0       1       0       0      0
##                ALPHABET STENCIL CRAFT         0       0       0       0      0
##                       ALUMINIUM HEART         0       0       0       0      0
##               ALUMINIUM STAMPED HEART         0       0       0       0      0
##                                amazon         0       0       0       0      0
##                                Amazon         0       0       0       0      0
##                                AMAZON         0       0       0       0      0
##                         amazon adjust         0       0       0       0      0
##                     Amazon Adjustment         0       0       0       0      0
##                            AMAZON FEE         0       0       0       0      0
##                          amazon sales         0       0       0       0      0
##                      Amazon sold sets         0       0       0       0      0
##            AMBER 3 BEAD DROP EARRINGS         0       0       0       0      0
##     AMBER BERTIE GLASS BEAD BAG CHARM         0       0       0       0      0
##       AMBER BERTIE MOBILE PHONE CHARM         0       0       0       0      0
##    AMBER CHUNKY BEAD BRACELET W STRAP         0       0       0       0      0
##      AMBER CHUNKY GLASS+BEAD NECKLACE         0       0       0       0      0
##           AMBER CRYSTAL DROP EARRINGS         0       0       0       0      0
##        AMBER DIAMANTE EXPANDABLE RING         0       0       0       0      0
##      AMBER DROP EARRINGS W LONG BEADS         0       0       0       0      0
##     AMBER FINE BEAD NECKLACE W TASSEL         0       0       0       0      0
##          AMBER GLASS TASSLE BAG CHARM         0       0       0       0      0
##      AMBER GLASS/SHELL/PEARL NECKLACE         0       0       0       0      0
##           AMBER GLASS/SILVER BRACELET         0       0       0       0      0
##         AMETHYST 3 BEAD DROP EARRINGS         0       0       0       0      0
##   AMETHYST CHUNKY BEAD BRACELET W STR         0       0       0       0      0
##     AMETHYST DIAMANTE EXPANDABLE RING         0       0       0       0      0
##   AMETHYST DROP EARRINGS W LONG BEADS         0       0       0       0      0
##   AMETHYST GLASS/SHELL/PEARL NECKLACE         0       0       0       0      0
##     AMETHYST HOOP EARRING FLORAL LEAF         0       0       0       0      0
##            ANGEL DECORATION 3 BUTTONS         0       1       0       0      0
##         ANGEL DECORATION PAINTED ZINC         0       1       0       0      0
##       ANGEL DECORATION STARS ON DRESS         0       0       0       0      0
##     ANGEL DECORATION WITH LACE PADDED         0       0       0       0      0
##                       ANIMAL STICKERS         0       0       0       0      0
##           ANIMALS AND NATURE WALL ART         1       0       0       0      0
##     ANT COPPER LIME BOUDICCA BRACELET         0       0       0       0      0
##     ANT COPPER PINK BOUDICCA BRACELET         0       0       0       0      0
##      ANT COPPER RED BOUDICCA BRACELET         0       0       0       0      0
##     ANT COPPER TURQ BOUDICCA BRACELET         0       0       0       0      0
##      ANT SILVER FUSCHIA BOUDICCA RING         0       0       0       0      0
##   ANT SILVER LIME GREEN BOUDICCA RING         0       0       0       0      0
##       ANT SILVER PURPLE BOUDICCA RING         0       0       0       0      0
##    ANT SILVER TURQUOISE BOUDICCA RING         0       0       0       0      0
##           ANT WHITE WIRE HEART SPIRAL         0       0       0       0      0
##         ANTIQUE ALL GLASS CANDLESTICK         0       0       0       0      0
##        ANTIQUE CREAM CUTLERY CUPBOARD         0       0       0       0      0
##           ANTIQUE CREAM CUTLERY SHELF         0       0       0       0      0
##      ANTIQUE GLASS DRESSING TABLE POT         0       0       0       0      0
##        ANTIQUE GLASS HEART DECORATION         0       0       0       0      0
##           ANTIQUE GLASS PEDESTAL BOWL         0       0       0       1      0
##           ANTIQUE GLASS PLACE SETTING         0       0       0       0      0
##              ANTIQUE HEART SHELF UNIT         0       0       0       0      0
##         ANTIQUE IVORY WIRE BOWL SMALL         0       0       0       0      0
##      ANTIQUE MID BLUE FLOWER EARRINGS         0       0       0       1      0
##   ANTIQUE OLIVE GREEN FLOWER EARRINGS         0       0       0       1      0
##    ANTIQUE OPAL WHITE FLOWER EARRINGS         0       0       0       0      0
##     ANTIQUE RASPBERRY FLOWER EARRINGS         0       0       0       0      0
##            ANTIQUE SILVER BAUBLE LAMP         0       0       0       0      0
##   ANTIQUE SILVER BOOK MARK WITH BEADS         0       0       0       0      0
##          ANTIQUE SILVER T-LIGHT GLASS         0       0       0       0      0
##     ANTIQUE SILVER TEA GLASS ENGRAVED         0       0       0       0      0
##       ANTIQUE SILVER TEA GLASS ETCHED         0       0       0       0      0
##   ANTIQUE TALL SWIRLGLASS TRINKET POT         0       0       0       1      0
##              APOTHECARY MEASURING JAR         1       0       0       0      0
##                     APPLE BATH SPONGE         0       0       0       1      0
##                   APRON APPLE DELIGHT         0       0       0       0      0
##           APRON MODERN VINTAGE COTTON         0       0       0       0      0
##      AQUA BERTIE GLASS BEAD BAG CHARM         0       0       0       0      0
##             AREA PATROLLED METAL SIGN         0       0       0       0      0
##              ARMY CAMO BOOKCOVER TAPE         0       0       0       0      0
##                ART LIGHTS,FUNK MONKEY         0       0       0       0      0
##                 ASS COL CIRCLE MOBILE         0       0       0       0      0
##      ASS COL LARGE SAND FROG P'WEIGHT         0       0       0       0      0
##     ASS COL SMALL SAND GECKO P'WEIGHT         0       0       0       0      0
##             ASS COLOUR GLOWING TIARAS         0       0       0       0      0
##    ASS DES PHONE SPONGE CRAFT STICKER         0       0       0       0      0
##    ASS FLORAL PRINT MULTI SCREWDRIVER         0       0       0       0      0
##         ASS FLORAL PRINT SPIRIT LEVEL         0       0       0       0      0
##          ASSORTED BOTTLE TOP  MAGNETS         1       0       0       4      0
##         ASSORTED CAKES FRIDGE MAGNETS         0       0       0       0      0
##        ASSORTED CHEESE FRIDGE MAGNETS         0       0       0       0      0
##              ASSORTED CIRCULAR MOBILE         0       0       0       0      0
##         ASSORTED COLOUR BIRD ORNAMENT         0       2       0       1      0
##   ASSORTED COLOUR LIZARD SUCTION HOOK         0       0       0       0      0
##             ASSORTED COLOUR METAL CAT         0       0       0       0      0
##            ASSORTED COLOUR MINI CASES         2       1       0       3      0
##     ASSORTED COLOUR SILK GLASSES CASE         0       0       0       0      0
##      ASSORTED COLOUR SUCTION CUP HOOK         0       0       0       0      0
##        ASSORTED COLOUR T-LIGHT HOLDER         0       0       0       0      0
##       ASSORTED COLOURED CIRCLE MOBILE         0       0       0       0      0
##             ASSORTED COLOURS SILK FAN         1       0       0       0      0
##              ASSORTED CREEPY CRAWLIES         0       0       0       0      0
##    ASSORTED EASTER DECORATIONS  BELLS         0       0       0       0      0
##             ASSORTED EASTER GIFT TAGS         1       0       0       0      0
##   ASSORTED FARMYARD ANIMALS IN BUCKET         0       0       0       0      0
##         ASSORTED FLOWER COLOUR "LEIS"         0       0       0       0      0
##                 ASSORTED INCENSE PACK         0       0       0       0      0
##     ASSORTED LAQUERED INCENSE HOLDERS         0       0       0       0      0
##         ASSORTED MINI MADRAS NOTEBOOK         0       0       0       0      0
##      ASSORTED MONKEY SUCTION CUP HOOK         0       0       0       0      0
##       ASSORTED SANSKRIT MINI NOTEBOOK         0       0       0       0      0
##     ASSORTED SHAPES PHOTO CLIP SILVER         0       0       0       0      0
##   ASSORTED TUTTI FRUTTI  FOB NOTEBOOK         0       0       0       0      0
##        ASSORTED TUTTI FRUTTI BRACELET         0       0       0       0      0
##       ASSORTED TUTTI FRUTTI HEART BOX         0       0       0       0      0
##    ASSORTED TUTTI FRUTTI KEYRING BALL         0       0       0       0      0
##     ASSORTED TUTTI FRUTTI LARGE PURSE         0       0       0       0      0
##          ASSORTED TUTTI FRUTTI MIRROR         0       0       0       0      0
##        ASSORTED TUTTI FRUTTI NOTEBOOK         0       0       0       0      0
##             ASSORTED TUTTI FRUTTI PEN         0       0       0       0      0
##     ASSORTED TUTTI FRUTTI SMALL PURSE         0       0       0       1      0
##   ASSTD COL BUTTERFLY/CRYSTAL W/CHIME         0       0       0       0      0
##        ASSTD DESIGN 3D PAPER STICKERS         0       0       0       0      0
##          ASSTD DESIGN BUBBLE GUM RING         0       0       0       0      0
##           ASSTD DESIGN RACING CAR PEN         0       0       0       0      0
##    ASSTD FRUIT+FLOWERS FRIDGE MAGNETS         0       0       0       0      0
##         ASSTD MULTICOLOUR CIRCLES MUG         0       0       0       0      0
##                ASSTD RASTA KEY-CHAINS         0       0       0       0      0
##          BABUSHKA LIGHTS STRING OF 10         0       0       0       0      0
##                     BABY BOOM RIBBONS         0       0       0       0      0
##          BABY MOUSE RED GINGHAM DRESS         0       0       0       0      0
##               BAG 125g SWIRLY MARBLES         0       0       0       2      0
##               BAG 250g SWIRLY MARBLES         0       1       0       1      0
##               BAG 500g SWIRLY MARBLES         0       0       0       1      0
##                  BAG OF SILVER STONES         0       0       0       0      0
##      BAKING MOULD CHOCOLATE CUP CAKES         0       0       0       0      0
##       BAKING MOULD CHOCOLATE CUPCAKES         0       0       0       1      0
##        BAKING MOULD CUPCAKE CHOCOLATE         0       0       0       0      0
##     BAKING MOULD EASTER EGG MILK CHOC         1       0       0       1      0
##    BAKING MOULD EASTER EGG WHITE CHOC         1       0       0       0      0
##     BAKING MOULD HEART MILK CHOCOLATE         0       0       0       2      0
##    BAKING MOULD HEART WHITE CHOCOLATE         0       0       0       0      0
##      BAKING MOULD ROSE MILK CHOCOLATE         0       0       0       0      0
##     BAKING MOULD ROSE WHITE CHOCOLATE         0       0       0       0      0
##    BAKING MOULD TOFFEE CUP  CHOCOLATE         0       0       0       0      0
##     BAKING MOULD TOFFEE CUP CHOCOLATE         0       0       0       0      0
##          BAKING SET 9 PIECE RETROSPOT         7       2       0       4      0
##            BAKING SET SPACEBOY DESIGN         8       1       0       2      0
##     BALLOON ART MAKE YOUR OWN FLOWERS         0       1       0       0      0
##         BALLOON PUMP WITH 10 BALLOONS         0       0       0       1      0
##         BALLOON WATER BOMB PACK OF 35         0       0       0       1      0
##                 BALLOONS  WRITING SET         0       0       0       0      0
##          BANK ACCOUNT  GREETING  CARD         0       0       0       0      0
##                          Bank Charges         0       0       0       0      0
##                BANQUET BIRTHDAY  CARD         0       0       0       0      0
##                       barcode problem         0       0       0       0      0
##      BAROQUE BUTTERFLY EARRINGS BLACK         0       0       0       0      0
##    BAROQUE BUTTERFLY EARRINGS CRYSTAL         0       0       0       0      0
##    BAROQUE BUTTERFLY EARRINGS MONTANA         0       0       0       0      0
##       BAROQUE BUTTERFLY EARRINGS PINK         0       0       0       0      0
##        BAROQUE BUTTERFLY EARRINGS RED         0       0       0       0      0
##          BASKET OF FLOWERS SEWING KIT         0       0       0       0      0
##                  BASKET OF TOADSTOOLS         0       0       0       1      0
##              BATH BUILDING BLOCK WORD         0       0       0       0      0
##                         BATHROOM HOOK         0       0       0       0      0
##                   BATHROOM METAL SIGN         0       0       0       0      0
##    BATHROOM SCALES FOOTPRINTS IN SAND         0       0       0       0      0
##          BATHROOM SCALES RUBBER DUCKS         0       0       0       0      0
##       BATHROOM SCALES, TROPICAL BEACH         0       0       0       0      0
##        BATHROOM SET LOVE HEART DESIGN         0       0       0       0      0
##           BEACH HUT DESIGN BLACKBOARD         0       0       0       0      0
##                 BEACH HUT KEY CABINET         0       0       0       0      0
##                      BEACH HUT MIRROR         0       0       0       0      0
##           BEACH HUT SHELF W 3 DRAWERS         0       0       0       0      0
##      BEADED CHANDELIER T-LIGHT HOLDER         0       0       0       0      0
##      BEADED CRYSTAL HEART BLUE  LARGE         0       0       0       0      0
##    BEADED CRYSTAL HEART BLUE ON STICK         0       0       0       0      0
##       BEADED CRYSTAL HEART BLUE SMALL         0       0       0       0      0
##      BEADED CRYSTAL HEART GREEN LARGE         0       0       0       0      0
##   BEADED CRYSTAL HEART GREEN ON STICK         0       0       0       0      0
##      BEADED CRYSTAL HEART GREEN SMALL         0       0       0       0      0
##       BEADED CRYSTAL HEART PINK LARGE         0       0       0       0      0
##    BEADED CRYSTAL HEART PINK ON STICK         0       0       0       0      0
##       BEADED CRYSTAL HEART PINK SMALL         0       0       0       0      0
##       BEADED LOVE HEART JEWELLERY SET         0       0       0       0      0
##        BEADED PEARL HEART WHITE LARGE         0       0       0       0      0
##     BEADED PEARL HEART WHITE ON STICK         0       0       0       0      0
##               BELL HEART ANTIQUE GOLD         0       0       0       0      0
##                 BELL HEART DECORATION         0       0       0       0      0
##        BELLE JARDINIERE CUSHION COVER         1       0       0       0      0
##               BEST DAD CANDLE LETTERS         0       0       0       0      0
##          BEWARE OF THE CAT METAL SIGN         0       0       0       2      0
##           BICYCLE PUNCTURE REPAIR KIT         0       0       0       0      0
##               BICYCLE SAFTEY WALL ART         1       0       0       0      0
##           BIG DOUGHNUT FRIDGE MAGNETS         0       0       0       0      0
##                      BIG POLKADOT MUG         0       0       0       0      0
##            BILI NUT AND WOOD NECKLACE         0       0       0       0      0
##                             BINGO SET         1       0       0       2      0
##    BIRD BOX CHRISTMAS TREE DECORATION         0       0       0       0      0
##        BIRD DECORATION GREEN POLKADOT         0       0       0       0      0
##         BIRD DECORATION RED RETROSPOT         0       1       0       1      0
##           BIRD HOUSE HOT WATER BOTTLE         0       0       0       1      0
##          BIRD ON BRANCH CANVAS SCREEN         0       0       0       0      0
##   BIRDCAGE DECORATION TEALIGHT HOLDER         0       0       0       2      0
##     BIRDHOUSE DECORATION MAGIC GARDEN         0       0       0       0      0
##               BIRDHOUSE GARDEN MARKER         2       0       0       0      0
##           BIRDS MOBILE VINTAGE DESIGN         0       1       0       1      0
##                  BIRTHDAY BANNER TAPE         0       0       0       0      0
##            BIRTHDAY BANQUET GIFT WRAP         0       0       0       0      0
##             BIRTHDAY CARD, RETRO SPOT         0       1       0       2      0
##    BIRTHDAY PARTY CORDON BARRIER TAPE         1       0       0       0      0
##            BISCUIT TIN 50'S CHRISTMAS         1       1       0       2      0
##         BISCUIT TIN VINTAGE CHRISTMAS         2       0       0       1      0
##             BISCUIT TIN VINTAGE GREEN         2       0       0       0      0
##              BISCUIT TIN VINTAGE LEAF         0       0       0       0      0
##               BISCUIT TIN VINTAGE RED         2       0       0       0      0
##        BISCUITS SMALL BOWL LIGHT BLUE         0       0       0       2      0
##            BLACK 3 BEAD DROP EARRINGS         0       0       0       0      0
##              BLACK AND WHITE CAT BOWL         0       0       0       1      0
##              BLACK AND WHITE DOG BOWL         0       0       0       0      0
##          BLACK BAROQUE CARRIAGE CLOCK         0       0       0       0      0
##              BLACK BAROQUE WALL CLOCK         0       0       0       0      0
##          BLACK BIRD GARDEN DESIGN MUG         0       0       0       0      0
##       BLACK CANDELABRA T-LIGHT HOLDER         0       0       0       0      0
##                 BLACK CHAMPAGNE GLASS         0       0       0       0      0
##                   BLACK CHERRY LIGHTS         0       0       0       0      0
##         BLACK CHRISTMAS FLOCK DROPLET         0       0       0       0      0
##            BLACK CHRISTMAS TREE 120CM         0       0       0       0      0
##             BLACK CHRISTMAS TREE 60CM         0       0       0       0      0
##    BLACK CHUNKY BEAD BRACELET W STRAP         0       0       0       0      0
##           BLACK CRYSTAL DROP EARRINGS         0       0       0       0      0
##        BLACK DIAMANTE EXPANDABLE RING         0       0       0       0      0
##        BLACK DIAMOND CLUSTER EARRINGS         0       0       0       0      0
##        BLACK DIAMOND CLUSTER NECKLACE         0       0       0       0      0
##                BLACK DINER WALL CLOCK         1       0       0       0      0
##           BLACK DROP CRYSTAL NECKLACE         0       0       0       0      0
##      BLACK DROP EARRINGS W LONG BEADS         0       0       0       0      0
##             BLACK EAR MUFF HEADPHONES         0       0       0       0      0
##              BLACK ENAMEL FLOWER RING         0       0       0       0      0
##       BLACK ENCHANTED FOREST PLACEMAT         0       0       0       0      0
##    BLACK FEATHER CHRISTMAS DECORATION         0       0       0       0      0
##     BLACK FINE BEAD NECKLACE W TASSEL         0       0       0       0      0
##             BLACK FLOWER CANDLE PLATE         0       0       0       0      0
##               BLACK GEMSTONE BRACELET         0       0       0       0      0
##          BLACK GEMSTONE NECKLACE 45CM         0       0       0       0      0
##   BLACK GLASS BRACELET W HEART CHARMS         0       0       0       0      0
##      BLACK GLASS/SHELL/PEARL NECKLACE         0       0       0       0      0
##       BLACK GRAND BAROQUE PHOTO FRAME         0       0       0       0      0
##               BLACK HEART CARD HOLDER         0       0       0       0      0
##                  BLACK KITCHEN SCALES         0       1       0       2      0
##                BLACK LOVE BIRD CANDLE         0       0       0       0      0
##        BLACK LOVE BIRD T-LIGHT HOLDER         0       0       0       0      0
##         BLACK MEDIUM GLASS CAKE STAND         0       0       0       0      0
##               BLACK MINI TAPE MEASURE         0       0       0       0      0
##                 BLACK ORANGE SQUEEZER         0       0       0       0      0
##                     BLACK PHOTO ALBUM         0       0       0       0      0
##           BLACK PIRATE TREASURE CHEST         0       0       0       0      0
##              BLACK RECORD COVER FRAME         1       1       0       0      0
##          BLACK SIL'T SQU CANDLE PLATE         0       0       0       0      0
##          BLACK SILOUETTE CANDLE PLATE         0       0       0       0      0
##          BLACK SMALL GLASS CAKE STAND         0       0       0       0      0
##              BLACK SQUARE TABLE CLOCK         0       0       0       0      0
##             BLACK STITCHED WALL CLOCK         0       0       0       0      0
##             BLACK SWEETHEART BRACELET         0       0       0       0      0
##        BLACK TEA TOWEL CLASSIC DESIGN         0       0       0       0      0
##           BLACK TEA,COFFEE,SUGAR JARS         0       0       0       0      0
##   BLACK VINT ART DEC CRYSTAL BRACELET         0       0       0       0      0
##   BLACK VINT ART DEC CRYSTAL NECKLACE         0       0       0       0      0
##       BLACK VINTAGE  CRYSTAL EARRINGS         0       0       0       0      0
##                BLACK VINTAGE EARRINGS         0       0       0       0      0
##                      BLACK WINE GLASS         0       0       0       0      0
##          BLACK/BLUE POLKADOT UMBRELLA         5       0       0       1      0
##     BLACK/WHITE GLASS/SILVER BRACELET         0       0       0       0      0
##         BLACK+WHITE NECKLACE W TASSEL         0       0       0       0      0
##              BLACKCHRISTMAS TREE 30CM         0       0       0       0      0
##                  BLING KEY RING STAND         0       0       0       0      0
##                   BLOND DOLL DOORSTOP         0       0       0       0      0
##          BLOSSOM  IMAGES NOTEBOOK SET         0       0       0       1      0
##          BLOSSOM IMAGES GIFT WRAP SET         0       0       0       2      0
##         BLOSSOM IMAGES SCRAP BOOK SET         0       0       0       0      0
##        BLUE  DIAMANTE PEN IN GIFT BOX         0       0       0       0      0
##                       BLUE  TILE HOOK         0       0       0       0      0
##                 BLUE  VOILE LAMPSHADE         0       0       0       0      0
##           BLUE & WHITE BREAKFAST TRAY         0       0       0       1      0
##     BLUE 3 PIECE POLKADOT CUTLERY SET         1       0       0       0      0
##             BLUE BIRDHOUSE DECORATION         0       0       0       0      0
##                BLUE BLOSSOM HAIR CLIP         0       0       0       0      0
##         BLUE BREAKFAST CUP AND SAUCER         0       0       0       0      0
##          BLUE BUNNY EASTER EGG BASKET         0       0       0       0      0
##                 BLUE CALCULATOR RULER         0       0       0       0      0
##    BLUE CAT BISCUIT BARREL PINK HEART         0       0       0       0      0
##   BLUE CHARLIE+LOLA PERSONAL DOORSIGN         1       0       0       0      0
##       BLUE CHECK BAG W HANDLE 34X20CM         0       0       0       0      0
##    BLUE CHENILLE SHAGGY CUSHION COVER         0       0       0       0      0
##       BLUE CIRCLES DESIGN MONKEY DOLL         0       0       0       0      0
##             BLUE CIRCLES DESIGN TEDDY         0       0       0       0      0
##     BLUE CLIMBING HYDRANGA ART FLOWER         0       0       0       0      0
##          BLUE COAT RACK PARIS FASHION         1       0       0       0      0
##           BLUE CRUSOE CHECK LAMPSHADE         0       0       0       0      0
##         BLUE CRYSTAL BOOT PHONE CHARM         0       0       0       0      0
##        BLUE CUSHION COVER WITH FLOWER         0       0       0       0      0
##                     BLUE DAISY MOBILE         0       0       0       0      0
##     BLUE DELPHINIUM ARTIFICIAL FLOWER         0       0       0       0      0
##                 BLUE DINER WALL CLOCK         3       0       0       4      0
##                    BLUE DISCO HANDBAG         0       0       0       0      0
##             BLUE DRAGONFLY HELICOPTER         0       0       0       0      0
##    BLUE DRAWER KNOB ACRYLIC EDWARDIAN         0       0       0       0      0
##     BLUE DROP EARRINGS W BEAD CLUSTER         0       0       0       0      0
##       BLUE EASTER EGG HUNT START POST         0       0       0       0      0
##                       BLUE EGG  SPOON         0       1       0       0      0
##           BLUE FELT EASTER EGG BASKET         0       0       0       0      0
##      BLUE FELT HANGING HEART W FLOWER         0       0       0       0      0
##   BLUE FELT HANGING HEART WITH FLOWER         0       0       0       0      0
##              BLUE FLOCK CUSHION COVER         0       0       0       0      0
##         BLUE FLOCK GLASS CANDLEHOLDER         0       0       0       0      0
##                 BLUE FLOWER DES PURSE         0       0       0       0      0
##                         BLUE FLY SWAT         0       0       0       0      0
##                      BLUE GEISHA GIRL         0       0       0       0      0
##         BLUE GIANT GARDEN THERMOMETER         1       0       0       0      0
##       BLUE GINGHAM ROSE CUSHION COVER         0       0       0       0      0
##      BLUE GLASS CHUNKY CHARM BRACELET         0       0       0       0      0
##                BLUE GLASS GEMS IN BAG         0       0       0       0      0
##    BLUE GREEN EMBROIDERY COSMETIC BAG         0       0       0       0      0
##       BLUE HANGING GINGHAM EASTER HEN         0       0       0       0      0
##           BLUE HAPPY BIRTHDAY BUNTING         5       1       0       2      0
##                 BLUE HARMONICA IN BOX         3       0       0       5      0
##             BLUE HEART COMPACT MIRROR         0       0       0       0      0
##                       BLUE HOLE PUNCH         0       0       0       0      0
##          BLUE JUICY FRUIT PHOTO FRAME         0       0       0       0      0
##                 BLUE KNITTED EGG COSY         0       0       0       0      0
##                      BLUE KNITTED HEN         0       0       0       0      0
##     BLUE LEAVES AND BEADS PHONE CHARM         0       0       0       0      0
##              BLUE MONTE CARLO HANDBAG         0       0       0       0      0
##            BLUE MURANO TWIST BRACELET         0       0       0       1      0
##            BLUE MURANO TWIST NECKLACE         0       0       0       0      0
##           BLUE NETTING STORAGE HANGER         0       0       0       0      0
##   BLUE NEW BAROQUE CANDLESTICK CANDLE         0       0       0       0      0
##    BLUE NEW BAROQUE FLOCK CANDLESTICK         0       0       0       0      0
##    BLUE ORGANDY ROUND LAMPSHADE W BEA         0       0       0       0      0
##                     BLUE OWL SOFT TOY         1       0       0       0      0
##               BLUE PADDED SOFT MOBILE         0       0       0       0      0
##           BLUE PAINTED KASHMIRI CHAIR         0       0       0       0      0
##                  BLUE PAISLEY JOURNAL         0       0       0       0      0
##                 BLUE PAISLEY NOTEBOOK         0       0       0       0      0
##              BLUE PAISLEY POCKET BOOK         0       0       0       0      0
##               BLUE PAISLEY SKETCHBOOK         0       0       0       0      0
##               BLUE PAISLEY TISSUE BOX         0       0       0       0      0
##                    BLUE PAPER PARASOL         0       0       0       0      0
##                       BLUE PARTY BAGS         0       0       0       0      0
##           BLUE PATCH PURSE PINK HEART         0       0       0       0      0
##                  BLUE POLKADOT BEAKER         0       0       0       0      0
##                    BLUE POLKADOT BOWL         2       1       0       3      0
##              BLUE POLKADOT COFFEE MUG         0       0       0       0      0
##                     BLUE POLKADOT CUP         2       2       0       3      0
##                 BLUE POLKADOT EGG CUP         0       0       0       0      0
##          BLUE POLKADOT GARDEN PARASOL         0       0       0       0      0
##                BLUE POLKADOT KIDS BAG         0       0       0       0      0
##             BLUE POLKADOT LUGGAGE TAG         0       0       0       0      0
##          BLUE POLKADOT PASSPORT COVER         0       0       0       0      0
##                   BLUE POLKADOT PLATE         3       2       0       2      0
##            BLUE POLKADOT PUDDING BOWL         0       0       0       0      0
##                   BLUE POLKADOT PURSE         0       0       0       0      0
##       BLUE POLKADOT WASHING UP GLOVES         0       0       0       0      0
##                    BLUE POLKADOT WRAP         0       1       0       2      0
##                 BLUE POT PLANT CANDLE         0       0       0       0      0
##                    BLUE PUDDING SPOON         0       0       0       0      0
##                  BLUE REFECTORY CLOCK         0       0       0       0      0
##         BLUE RETRO KITCHEN WALL CLOCK         0       0       0       0      0
##               BLUE ROSE FABRIC MIRROR         0       0       0       0      0
##   BLUE ROSE PATCH PURSE PINK BUTTERFL         0       0       0       0      0
##             BLUE ROUND COMPACT MIRROR         0       0       0       0      0
##     BLUE SAVANNAH PICNIC HAMPER FOR 2         0       0       0       1      0
##        BLUE SCANDINAVIAN PAISLEY WRAP         0       1       0       0      0
##     BLUE SCOTTIE DOG W FLOWER PATTERN         0       0       0       0      0
##                 BLUE SHARK HELICOPTER         0       0       0       0      0
##         BLUE SPOT CERAMIC DRAWER KNOB         0       1       0       0      0
##            BLUE SQUARE COMPACT MIRROR         0       0       0       0      0
##        BLUE STONES ON WIRE FOR CANDLE         0       0       0       0      0
##       BLUE STRIPE CERAMIC DRAWER KNOB         0       1       0       0      0
##             BLUE STRIPES SHOULDER BAG         0       0       0       0      0
##              BLUE SWEETHEART BRACELET         0       0       0       0      0
##                 BLUE TABLE RUN FLOWER         0       0       0       0      0
##         BLUE TEA TOWEL CLASSIC DESIGN         0       0       0       0      0
##               BLUE TEATIME PRINT BOWL         0       0       0       0      0
##                       BLUE TILED TRAY         0       0       0       0      0
##             BLUE TRAVEL FIRST AID KIT         0       0       0       0      0
##                    BLUE TV TRAY TABLE         0       0       0       0      0
##        BLUE VICTORIAN FABRIC OVAL BOX         0       0       0       0      0
##              BLUE VINTAGE SPOT BEAKER         2       1       0       1      0
##    BLUE WHITE PLASTIC RINGS LAMPSHADE         0       0       0       0      0
##        BLUE WIRE SPIRAL CANDLE HOLDER         0       0       0       0      0
##       BLUE/CREAM STRIPE CUSHION COVER         0       0       0       0      0
##   BLUE/GREEN SHELL NECKLACE W PENDANT         0       0       0       0      0
##     BLUE/NAT SHELL NECKLACE W PENDANT         0       0       0       0      0
##     BLUE/YELLOW CERAMIC CANDLE HOLDER         0       0       0       0      0
##     BLUE/YELLOW FLOWER DESIGN BIG MUG         0       0       0       0      0
##       BOHEMIAN COLLAGE STATIONERY SET         0       0       0       0      0
##                 BOOM BOX SPEAKER BOYS         0       0       0       0      0
##                BOOM BOX SPEAKER GIRLS         0       0       0       0      0
##           BOOZE & WOMEN GREETING CARD         0       0       0       0      0
##          BOTANICAL GARDENS WALL CLOCK         0       0       0       0      0
##      BOTANICAL LAVENDER BIRTHDAY CARD         0       0       0       0      0
##          BOTANICAL LAVENDER GIFT WRAP         0       0       0       0      0
##              BOTANICAL LILY GIFT WRAP         0       0       0       0      0
##          BOTANICAL LILY GREETING CARD         0       0       0       0      0
##              BOTANICAL ROSE GIFT WRAP         0       0       0       1      0
##          BOTANICAL ROSE GREETING CARD         0       0       0       0      0
##                  BOTTLE BAG RETROSPOT         0       0       0       0      0
##             BOUDOIR SQUARE TISSUE BOX         0       0       0       2      0
##           BOX OF 24 COCKTAIL PARASOLS         0       0       0       1      0
##    BOX OF 6 ASSORTED COLOUR TEASPOONS         0       0       0       1      0
##   BOX OF 6 CHRISTMAS CAKE DECORATIONS         1       1       0       1      0
##           BOX OF 6 MINI 50'S CRACKERS         1       0       0       2      0
##        BOX OF 6 MINI VINTAGE CRACKERS         1       1       0       0      0
##               BOX OF 9 PEBBLE CANDLES         0       0       0       0      0
##        BOX OF VINTAGE ALPHABET BLOCKS         0       0       0       0      0
##          BOX OF VINTAGE JIGSAW BLOCKS         0       0       0       1      0
##          BOX/12 CHICK & EGG IN BASKET         1       0       0       0      0
##                   BOXED GLASS ASHTRAY         0       0       0       0      0
##         BOYS ALPHABET IRON ON PATCHES         0       0       0       0      0
##                        BOYS PARTY BAG         0       0       0       0      0
##       BOYS VINTAGE TIN SEASIDE BUCKET         1       0       0       2      0
##           BREAD BIN DINER STYLE IVORY         0       2       0       6      0
##            BREAD BIN DINER STYLE MINT         1       1       0       0      0
##            BREAD BIN DINER STYLE PINK         1       0       0       0      0
##             BREAD BIN DINER STYLE RED         1       3       0       8      0
##         BREAD BIN, DINER STYLE, IVORY         0       0       0       0      0
##          BREAD BIN, DINER STYLE, MINT         0       0       0       0      0
##                             Breakages         0       0       0       0      0
##                  BRIGHT BLUES RIBBONS         0       0       0       0      0
##                    BROCADE RING PURSE         0       1       0       0      0
##                    BROCANTE COAT RACK         0       0       0       0      0
##             BROCANTE SHELF WITH HOOKS         0       0       0       0      0
##                                broken         0       0       0       0      0
##          BROWN  PIRATE TREASURE CHEST         0       0       0       0      0
##              BROWN CHECK CAT DOORSTOP         0       0       0       0      0
##     BROWN KUKUI COCONUT SEED NECKLACE         0       0       0       0      0
##      BROWN VINTAGE VICTORIAN EARRINGS         0       0       0       0      0
##               BUBBLEGUM RING ASSORTED         0       0       0       3      0
##        BUFFALO BILL TREASURE BOOK BOX         2       0       0       0      0
##                 BUFFALO BILL WALL ART         1       0       0       0      0
##                BULL DOG BOTTLE OPENER         0       0       0       0      0
##        BULL DOG BOTTLE TOP WALL CLOCK         0       0       0       0      0
##   BUNDLE OF 3 ALPHABET EXERCISE BOOKS         3       0       0       0      0
##      BUNDLE OF 3 RETRO EXERCISE BOOKS         0       0       0       0      0
##          BUNDLE OF 3 RETRO NOTE BOOKS         0       0       0       1      0
##     BUNDLE OF 3 SCHOOL EXERCISE BOOKS         2       0       0       3      0
##         BUNNY DECORATION MAGIC GARDEN         0       0       0       0      0
##                         BUNNY EGG BOX         0       0       0       0      0
##                     BUNNY EGG GARLAND         0       0       0       0      0
##        BUNNY WOODEN PAINTED WITH BIRD         0       0       0       0      0
##      BUNNY WOODEN PAINTED WITH FLOWER         0       0       0       0      0
##                      BUNTING , SPOTTY         0       0       0       0      0
##                  BUTTERFLIES STICKERS         0       1       0       0      0
##          BUTTERFLY CROCHET FOOD COVER         0       0       0       0      0
##               BUTTERFLY CUSHION COVER         0       0       0       0      0
##                   BUTTERFLY HAIR BAND         0       0       0       0      0
##                            BUTTON BOX         1       0       0       0      0
##          BUTTONS AND STRIPES NOTEBOOK         0       0       0       0      0
##             CABIN BAG VINTAGE PAISLEY         1       0       0       0      0
##           CABIN BAG VINTAGE RETROSPOT         0       0       0       4      0
##                 CACTI T-LIGHT CANDLES         0       0       0       1      0
##              CAKE PLATE LOVEBIRD PINK         0       0       0       1      0
##             CAKE PLATE LOVEBIRD WHITE         1       0       0       1      0
##              CAKE SHOP  STICKER SHEET         0       0       0       0      0
##        CAKE STAND 3 TIER MAGIC GARDEN         0       0       0       1      0
##                 CAKE STAND LACE WHITE         0       0       0       0      0
##       CAKE STAND LOVEBIRD 2 TIER PINK         0       0       0       1      0
##      CAKE STAND LOVEBIRD 2 TIER WHITE         0       0       0       0      0
##   CAKE STAND VICTORIAN FILIGREE LARGE         0       0       0       0      0
##     CAKE STAND VICTORIAN FILIGREE MED         0       0       0       0      0
##   CAKE STAND VICTORIAN FILIGREE SMALL         0       0       0       0      0
##        CAKE STAND WHITE TWO TIER LACE         0       0       0       0      0
##             CAKES AND BOWS GIFT  TAPE         0       0       0       2      0
##      CAKES AND RABBITS DESIGN FLANNEL         0       0       0       0      0
##          CAKESTAND, 3 TIER, LOVEHEART         0       0       0       0      0
##            CALENDAR FAMILY FAVOURITES         0       0       0       0      0
##             CALENDAR IN SEASON DESIGN         0       0       0       0      0
##             CALENDAR PAPER CUT DESIGN         0       0       0       1      0
##                   came coded as 20713         0       0       0       0      0
##               CAMOUFLAGE DESIGN TEDDY         0       0       0       0      0
##                 CAMOUFLAGE DOG COLLAR         0       0       0       0      0
##        CAMOUFLAGE EAR MUFF HEADPHONES         0       0       0       0      0
##                  CAMOUFLAGE LED TORCH         0       0       0       0      0
##      CAMPHOR WOOD PORTOBELLO MUSHROOM         0       0       0       0      0
##                            can't find         0       0       0       0      0
##         CANDLE HOLDER SILVER MADELINE         0       0       0       0      0
##               CANDLE PLATE LACE WHITE         0       0       0       1      0
##       CANDLEHOLDER PINK HANGING HEART         0       0       0       0      0
##        CANDY HEART HANGING DECORATION         0       0       0       1      0
##             CANDY SHOP  STICKER SHEET         0       0       0       0      0
##                      CANDY SPOT BUNNY         0       0       0       0      0
##              CANDY SPOT CUSHION COVER         0       0       0       0      0
##            CANDY SPOT EGG WARMER HARE         0       0       0       0      0
##          CANDY SPOT EGG WARMER RABBIT         0       0       0       0      0
##                   CANDY SPOT HAND BAG         0       0       0       0      0
##           CANDY SPOT HEART DECORATION         0       0       0       0      0
##                   CANDY SPOT TEA COSY         0       0       0       0      0
##            CANNABIS LEAF BEAD CURTAIN         0       0       0       0      0
##         CANNISTER VINTAGE LEAF DESIGN         0       0       0       0      0
##                      CAPIZ CHANDELIER         0       0       0       0      0
##             CARAVAN SQUARE TISSUE BOX         0       0       0       2      0
##                   CARD BILLBOARD FONT         1       0       0       0      0
##                  CARD BIRTHDAY COWBOY         1       0       0       0      0
##                     CARD CAT AND TREE         0       0       0       0      0
##                CARD CHRISTMAS VILLAGE         2       2       0       0      0
##                    CARD CIRCUS PARADE         2       0       0       3      0
##                     CARD DOG AND BALL         0       1       0       1      0
##                       CARD DOLLY GIRL         3       1       0       6      0
##                     CARD GINGHAM ROSE         0       0       0       1      0
##             CARD HOLDER GINGHAM HEART         0       0       0       1      0
##           CARD HOLDER LOVE BIRD LARGE         0       0       0       0      0
##           CARD HOLDER LOVE BIRD SMALL         0       0       0       0      0
##                    CARD I LOVE LONDON         0       0       0       0      0
##                  CARD MOTORBIKE SANTA         0       1       0       3      0
##                      CARD PARTY GAMES         0       2       0       0      0
##               CARD PSYCHEDELIC APPLES         0       0       0       1      0
##                    CARD SUKI BIRTHDAY         0       0       0       2      0
##                      CARD WEDDING DAY         1       0       0       1      0
##     CARDHOLDER GINGHAM CHRISTMAS TREE         0       0       0       0      0
##               CARDHOLDER GINGHAM STAR         0       0       0       1      0
##         CARDHOLDER HOLLY WREATH METAL         0       0       0       0      0
##                     CARNIVAL BRACELET         0       0       0       0      0
##               CAROUSEL DESIGN WASHBAG         0       0       0       0      0
##              CAROUSEL PONIES BABY BIB         0       0       0       0      0
##                              CARRIAGE         0       0       0       0      0
##       CARROT CHARLIE+LOLA COASTER SET         1       0       0       0      0
##            CARTOON  PENCIL SHARPENERS         0       0       0       0      0
##            CAST IRON HOOK GARDEN FORK         0       0       0       0      0
##          CAST IRON HOOK GARDEN TROWEL         0       0       0       0      0
##                 CAT AND BIRD WALL ART         0       0       0       0      0
##                CAT BOWL VINTAGE CREAM         0       0       0       0      0
##        CAT WITH SUNGLASSES BLANK CARD         0       0       0       0      0
##              CD WALL TIDY BLUE OFFICE         0       0       0       0      0
##              CD WALL TIDY RED FLOWERS         0       0       0       0      0
##   CERAMIC BIRDHOUSE CRESTED TIT SMALL         0       0       0       0      0
##   CERAMIC BOWL WITH LOVE HEART DESIGN         0       0       0       0      0
##   CERAMIC BOWL WITH STRAWBERRY DESIGN         0       1       0       0      0
##     CERAMIC CAKE BOWL + HANGING CAKES         0       0       1       0      0
##       CERAMIC CAKE DESIGN SPOTTED MUG         0       0       0       2      0
##     CERAMIC CAKE DESIGN SPOTTED PLATE         0       1       0       1      0
##    CERAMIC CAKE STAND + HANGING CAKES         0       2       1       0      0
##        CERAMIC CHERRY CAKE MONEY BANK         0       1       0       3      0
##   CERAMIC HEART FAIRY CAKE MONEY BANK         0       0       0       0      0
##         CERAMIC LOVE HEART MONEY BANK         0       0       0       0      0
##       CERAMIC PIRATE CHEST MONEY BANK         0       0       0       0      0
##       CERAMIC PLATE STRAWBERRY DESIGN         0       0       0       0      0
##    CERAMIC STRAWBERRY CAKE MONEY BANK         0       1       0       2      0
##         CERAMIC STRAWBERRY DESIGN MUG         0       2       0       0      0
##          CERAMIC STRAWBERRY MONEY BOX         0       0       0       1      0
##       CERAMIC STRAWBERRY TRINKET TRAY         1       0       0       0      0
##          CHALKBOARD KITCHEN ORGANISER         0       0       0       0      0
##                          CHAMBRE HOOK         0       0       0       0      0
##             CHAMPAGNE TRAY BLANK CARD         0       0       0       0      0
##    CHARLIE & LOLA WASTEPAPER BIN BLUE         0       0       0       0      0
##   CHARLIE & LOLA WASTEPAPER BIN FLORA         1       0       0       0      0
##          CHARLIE + LOLA BISCUITS TINS         1       0       0       0      0
##   CHARLIE + LOLA RED HOT WATER BOTTLE         0       0       0       0      0
##        CHARLIE AND LOLA CHARLOTTE BAG         0       0       0       0      0
##         CHARLIE AND LOLA FIGURES TINS         0       0       0       1      0
##           CHARLIE AND LOLA TABLE TINS         0       0       0       0      0
##    CHARLIE LOLA BLUE HOT WATER BOTTLE         0       0       0       0      0
##        CHARLIE+LOLA MY ROOM DOOR SIGN         0       0       0       0      0
##    CHARLIE+LOLA PINK HOT WATER BOTTLE         0       0       0       0      0
##     CHARLIE+LOLA RED HOT WATER BOTTLE         0       0       0       0      0
##     CHARLIE+LOLA"EXTREMELY BUSY" SIGN         1       0       0       0      0
##        CHARLOTTE BAG ALPHABET  DESIGN         0       0       0       0      0
##           CHARLOTTE BAG APPLES DESIGN         0       0       0      10      0
##       CHARLOTTE BAG DOLLY GIRL DESIGN         0       0       0       8      0
##           CHARLOTTE BAG PINK POLKADOT         1       1       0       8      0
##             CHARLOTTE BAG SUKI DESIGN         0       0       0       7      0
##        CHARLOTTE BAG VINTAGE ALPHABET         0       0       0       1      0
##                                 check         0       0       0       0      0
##                                 CHECK         0       0       0       0      0
##                                check?         0       0       0       0      0
##      CHERRY BLOSSOM  DECORATIVE FLASK         0       0       0       0      0
##     CHERRY BLOSSOM CANVAS ART PICTURE         0       0       0       0      0
##       CHERRY BLOSSOM DECORATIVE FLASK         0       0       0       1      0
##            CHERRY BLOSSOM LUGGAGE TAG         0       0       0       0      0
##         CHERRY BLOSSOM PASSPORT COVER         0       0       0       0      0
##                  CHERRY BLOSSOM PURSE         0       0       0       0      0
##            CHERRY BLOSSOM TABLE CLOCK         0       0       0       0      0
##             CHERRY CROCHET FOOD COVER         0       0       0       1      0
##          CHERUB HEART DECORATION GOLD         0       0       0       0      0
##        CHERUB HEART DECORATION SILVER         0       0       0       0      0
##            CHEST 7 DRAWER MA CAMPAGNE         0       0       0       0      0
##         CHEST NATURAL WOOD 20 DRAWERS         0       0       0       0      0
##        CHEST OF DRAWERS GINGHAM HEART         0       0       0       0      0
##           CHICK GREY HOT WATER BOTTLE         0       0       0       1      0
##           CHILDREN'S APRON DOLLY GIRL         0       0       0       3      0
##          CHILDREN'S CIRCUS PARADE MUG         2       0       0       0      0
##               CHILDREN'S SPACEBOY MUG         0       0       0       1      0
##         CHILDRENS APRON APPLES DESIGN         0       1       0       2      0
##       CHILDRENS APRON SPACEBOY DESIGN         0       1       0       5      0
##       CHILDRENS CUTLERY CIRCUS PARADE         2       2       0       4      0
##          CHILDRENS CUTLERY DOLLY GIRL         2       1       0       8      0
##       CHILDRENS CUTLERY POLKADOT BLUE         1       1       0       1      0
##      CHILDRENS CUTLERY POLKADOT GREEN         0       2       0       2      0
##       CHILDRENS CUTLERY POLKADOT PINK         1       2       0       5      0
##       CHILDRENS CUTLERY RETROSPOT RED         2       2       0       7      0
##            CHILDRENS CUTLERY SPACEBOY         2       2       0      11      0
##              CHILDRENS DOLLY GIRL MUG         0       0       0       1      0
##          CHILDRENS GARDEN GLOVES BLUE         1       0       0       0      0
##          CHILDRENS GARDEN GLOVES PINK         1       0       0       0      0
##                CHILDRENS SPACEBOY MUG         0       0       0       0      0
##     CHILDRENS TOY COOKING UTENSIL SET         0       0       0       0      0
##    CHILDS BREAKFAST SET CIRCUS PARADE         2       0       0       1      0
##       CHILDS BREAKFAST SET DOLLY GIRL         2       0       0       3      0
##         CHILDS BREAKFAST SET SPACEBOY         2       0       0       3      0
##              CHILDS GARDEN BRUSH BLUE         1       0       0       0      0
##              CHILDS GARDEN BRUSH PINK         1       0       0       0      0
##               CHILDS GARDEN FORK BLUE         1       0       0       0      0
##               CHILDS GARDEN FORK PINK         1       0       0       0      0
##               CHILDS GARDEN RAKE BLUE         1       0       0       0      0
##               CHILDS GARDEN RAKE PINK         1       0       0       0      0
##              CHILDS GARDEN SPADE BLUE         1       0       0       0      0
##              CHILDS GARDEN SPADE PINK         1       0       0       0      0
##             CHILDS GARDEN TROWEL BLUE         0       0       0       0      0
##             CHILDS GARDEN TROWEL PINK         0       0       0       0      0
##                         CHILLI LIGHTS         0       0       0       0      0
##         CHINESE DRAGON PAPER LANTERNS         0       0       0       0      0
##         CHOC TRUFFLE GOLD TRINKET POT         0       0       0       1      0
##    CHOCOLATE 1 WICK MORRIS BOX CANDLE         0       0       0       0      0
##    CHOCOLATE 3 WICK MORRIS BOX CANDLE         0       0       0       0      0
##                 CHOCOLATE BOX RIBBONS         0       0       0       0      0
##                  CHOCOLATE CALCULATOR         0       0       0       1      0
##            CHOCOLATE HOT WATER BOTTLE         0       1       0       0      0
##         CHOCOLATE THIS WAY METAL SIGN         0       0       0       2      0
##           CHRISTMAS CARD SCREEN PRINT         0       0       0       0      0
##          CHRISTMAS CARD SINGING ANGEL         0       0       0       0      0
##      CHRISTMAS CARD STACK OF PRESENTS         0       0       0       0      0
##        CHRISTMAS CRAFT HEART STOCKING         0       0       0       0      0
##        CHRISTMAS CRAFT LITTLE FRIENDS         0       2       0       1      0
##        CHRISTMAS CRAFT TREE TOP ANGEL         0       1       0       1      0
##           CHRISTMAS CRAFT WHITE FAIRY         0       1       0       1      0
##            CHRISTMAS DECOUPAGE CANDLE         0       0       0       0      0
##         CHRISTMAS GARLAND STARS,TREES         0       0       0       0      0
##               CHRISTMAS GINGHAM HEART         0       0       0       0      0
##                CHRISTMAS GINGHAM STAR         0       0       0       0      0
##                CHRISTMAS GINGHAM TREE         0       0       0       0      0
##     CHRISTMAS HANGING HEART WITH BELL         0       0       0       0      0
##           CHRISTMAS HANGING SNOWFLAKE         0       0       0       0      0
##      CHRISTMAS HANGING STAR WITH BELL         0       0       0       0      0
##      CHRISTMAS HANGING TREE WITH BELL         0       0       0       0      0
##          CHRISTMAS LIGHTS 10 REINDEER         1       0       0       2      0
##            CHRISTMAS LIGHTS 10 SANTAS         0       0       0       1      0
##   CHRISTMAS LIGHTS 10 VINTAGE BAUBLES         0       0       0       1      0
##   CHRISTMAS METAL POSTCARD WITH BELLS         0       0       0       1      0
##         CHRISTMAS METAL TAGS ASSORTED         0       0       0       0      0
##          CHRISTMAS MUSICAL ZINC HEART         0       0       0       0      0
##           CHRISTMAS MUSICAL ZINC STAR         0       0       0       0      0
##           CHRISTMAS MUSICAL ZINC TREE         0       0       0       0      0
##         CHRISTMAS PUDDING TRINKET POT         0       0       0       0      0
##        CHRISTMAS RETROSPOT ANGEL WOOD         0       1       0       1      0
##        CHRISTMAS RETROSPOT HEART WOOD         0       0       0       0      0
##         CHRISTMAS RETROSPOT STAR WOOD         2       0       0       1      0
##         CHRISTMAS RETROSPOT TREE WOOD         0       0       0       1      0
##   CHRISTMAS STAR WISH LIST CHALKBOARD         0       0       0       0      0
##   CHRISTMAS TABLE CANDLE SILVER SPIKE         0       0       0       0      0
##   CHRISTMAS TABLE SILVER CANDLE SPIKE         0       0       0       0      0
##                 CHRISTMAS TOILET ROLL         0       0       0       0      0
##   CHRISTMAS TREE DECORATION WITH BELL         0       0       0       0      0
##           CHRISTMAS TREE HANGING GOLD         0       0       0       0      0
##         CHRISTMAS TREE HANGING SILVER         0       0       0       0      0
##       CHRISTMAS TREE HEART DECORATION         0       0       0       0      0
##           CHRISTMAS TREE PAINTED ZINC         0       0       0       0      0
##        CHRISTMAS TREE STAR DECORATION         0       0       0       0      0
##         CHRISTMAS TREE T-LIGHT HOLDER         0       0       0       0      0
##                CHRYSANTHEMUM  JOURNAL         0       0       0       0      0
##                CHRYSANTHEMUM NOTEBOOK         0       0       0       0      0
##             CHRYSANTHEMUM POCKET BOOK         0       0       0       0      0
##              CHRYSANTHEMUM SKETCHBOOK         0       0       0       0      0
##   CHUNKY CRACKED GLAZE NECKLACE IVORY         0       0       0       0      0
##   CHUNKY SILVER NECKLACE PASTEL FLOWE         0       0       0       0      0
##              CINAMMON & ORANGE WREATH         0       0       0       0      0
##            CINAMMON SET OF 9 T-LIGHTS         0       0       0       0      0
##                 CINDERELLA CHANDELIER         0       0       0       0      0
##        CINNAMON SCENTED VOTIVE CANDLE         0       0       0       1      0
##           CIRCUS PARADE BABY GIFT SET         0       1       0       3      0
##       CIRCUS PARADE CHILDRENS EGG CUP         0       0       0       1      0
##               CIRCUS PARADE LUNCH BOX         5       0       0      10      0
##           CITRONELLA CANDLE FLOWERPOT         0       0       0       0      0
##          CITRONELLA CANDLE GARDEN POT         0       0       0       0      0
##           CITRUS GARLAND FELT FLOWERS         0       0       0       0      0
##                      CLAM SHELL LARGE         0       0       0       0      0
##                      CLAM SHELL SMALL         0       0       0       0      0
##                 CLASSIC BICYCLE CLIPS         0       0       0       0      0
##          CLASSIC CAFE SUGAR DISPENSER         0       0       0       0      0
##           CLASSIC CHROME BICYCLE BELL         1       1       0       1      0
##            CLASSIC CROME BICYCLE BELL         0       0       0       0      0
##         CLASSIC DIAMANTE EARRINGS JET         0       0       0       0      0
##         CLASSIC DIAMANTE NECKLACE JET         0       0       0       0      0
##     CLASSIC FRENCH STYLE BASKET BROWN         0       0       0       0      0
##     CLASSIC FRENCH STYLE BASKET GREEN         0       0       0       0      0
##   CLASSIC FRENCH STYLE BASKET NATURAL         0       0       0       0      0
##              CLASSIC GLASS COOKIE JAR         0       0       0       0      0
##               CLASSIC GLASS SWEET JAR         0       0       0       0      0
##   CLASSIC METAL BIRDCAGE PLANT HOLDER         0       0       0       0      0
##               CLASSIC SUGAR DISPENSER         0       0       0       0      0
##                   CLASSIC WHITE FRAME         0       0       0       0      0
##            CLASSICAL ROSE CANDLESTAND         0       0       0       0      0
##             CLASSICAL ROSE SMALL VASE         0       0       0       0      0
##             CLASSICAL ROSE TABLE LAMP         0       0       0       0      0
##          CLEAR ACRYLIC FACETED BANGLE         0       0       0       0      0
##        CLEAR CRYSTAL STAR PHONE CHARM         0       0       0       0      0
##   CLEAR DRAWER KNOB ACRYLIC EDWARDIAN         0       0       0       0      0
##        CLEAR LOVE BIRD T-LIGHT HOLDER         0       0       0       0      0
##                 CLEAR MILKSHAKE GLASS         0       0       0       0      0
##              CLEAR STATIONERY BOX SET         0       0       0       0      0
##            CLOCK MAGNET MUM'S KITCHEN         0       0       0       0      1
##        CLOTHES PEGS RETROSPOT PACK 24         0       0       0       1      0
##                     COCKLE SHELL DISH         0       0       0       0      0
##             COCKTAIL SWORDS 50 PIECES         0       0       0       0      0
##                    code mix up? 84930         0       0       0       0      0
##              COFFEE MUG APPLES DESIGN         0       0       0       9      0
##        COFFEE MUG BLUE PAISLEY DESIGN         0       0       0       0      0
##          COFFEE MUG CAT + BIRD DESIGN         0       0       0       1      0
##          COFFEE MUG DOG + BALL DESIGN         0       0       0       0      0
##              COFFEE MUG PEARS  DESIGN         0       0       0       5      0
##        COFFEE MUG PINK PAISLEY DESIGN         0       0       0       0      0
##            COFFEE SCENT PILLAR CANDLE         0       0       0       0      0
##   COLOUR GLASS T-LIGHT HOLDER HANGING         0       0       0       0      0
##     COLOUR GLASS. STAR T-LIGHT HOLDER         0       0       0       0      0
##    COLOURED GLASS STAR T-LIGHT HOLDER         0       0       0       0      0
##           COLOURFUL FLOWER FRUIT BOWL         0       0       0       0      0
##          COLOURING PENCILS BROWN TUBE         0       0       0       0      0
##                COLUMBIAN  CUBE CANDLE         0       0       0       0      0
##            COLUMBIAN CANDLE RECTANGLE         0       0       0       0      0
##                COLUMBIAN CANDLE ROUND         0       0       0       0      0
##                 COLUMBIAN CUBE CANDLE         0       0       0       0      0
##   CONDIMENT TRAY 4 BOWLS AND 4 SPOONS         0       0       0       0      0
##               CONGRATULATIONS BUNTING         0       0       0       0      0
##             COOK WITH WINE METAL SIGN         0       0       0       0      1
##                 COOKING SET RETROSPOT         0       0       0       0      0
##            COPPER AND BRASS BAG CHARM         0       0       0       0      0
##    COPPER/OLIVE GREEN FLOWER NECKLACE         0       0       0       0      0
##                     CORDIAL GLASS JUG         0       0       0       0      0
##                           CORDIAL JUG         0       0       0       0      0
##                   CORONA MEXICAN TRAY         1       0       0       0      0
##     COSMETIC BAG VINTAGE ROSE PAISLEY         0       0       0       0      0
##           COSY HOUR CIGAR BOX MATCHES         0       0       0       0      0
##          COSY HOUR GIANT TUBE MATCHES         0       0       0       0      0
##        COSY SLIPPER SHOES LARGE GREEN         0       0       0       0      0
##         COSY SLIPPER SHOES SMALL  RED         0       0       0       0      0
##        COSY SLIPPER SHOES SMALL GREEN         0       0       0       0      0
##                 COTE D'AZURE NECKLACE         0       0       0       0      0
##            COTTON APRON PANTRY DESIGN         1       0       0       1      0
##                               counted         0       0       0       0      0
##       COUNTRY COTTAGE  DOORSTOP GREEN         0       0       0       0      0
##     COWBOYS AND INDIANS BIRTHDAY CARD         2       0       0       0      0
##                               cracked         0       0       0       0      0
##          CRACKED GLAZE EARRINGS BROWN         0       0       0       0      0
##          CRACKED GLAZE EARRINGS IVORY         0       0       0       0      0
##            CRACKED GLAZE EARRINGS RED         0       0       0       0      0
##          CRACKED GLAZE NECKLACE BROWN         0       0       0       0      0
##          CRACKED GLAZE NECKLACE IVORY         0       0       0       0      0
##            CRACKED GLAZE NECKLACE RED         0       0       0       0      0
##          CRAZY DAISY HEART DECORATION         0       0       0       0      0
##           CREAM AND PINK FLOWERS PONY         0       0       0       0      0
##         CREAM BUNNY EASTER EGG BASKET         0       0       0       0      0
##    CREAM CLIMBING HYDRANGA ART FLOWER         0       0       0       0      0
##        CREAM CUPID HEARTS COAT HANGER         0       1       0       0      0
##    CREAM DELPHINIUM ARTIFICIAL FLOWER         0       0       0       0      0
##          CREAM FELT EASTER EGG BASKET         0       0       0       0      0
##    CREAM HANGING HEART T-LIGHT HOLDER         0       0       0       0      0
##               CREAM HEART CARD HOLDER         0       0       0       0      0
##    CREAM SLICE FLANNEL CHOCOLATE SPOT         0       1       0       1      0
##         CREAM SLICE FLANNEL PINK SPOT         0       0       0       2      0
##           CREAM SWEETHEART EGG HOLDER         0       0       0       0      0
##          CREAM SWEETHEART LETTER RACK         0       0       0       0      0
##           CREAM SWEETHEART MINI CHEST         0       0       0       1      0
##         CREAM SWEETHEART WALL CABINET         0       0       0       0      0
##       CREAM WALL PLANTER HEART SHAPED         0       0       0       0      0
##        CROCHET BEAR RED/BLUE  KEYRING         0       0       0       0      0
##                   CROCHET DOG KEYRING         0       0       0       0      0
##        CROCHET LILAC/RED BEAR KEYRING         0       0       0       0      0
##       CROCHET ROSE DES CLOTHES HANGER         0       0       0       0      0
##    CROCHET ROSE PURSE WITH SUEDE BACK         0       0       0       0      0
##          CROCHET WHITE RABBIT KEYRING         0       0       0       0      0
##                               crushed         0       0       0       0      0
##                               Crushed         0       0       0       0      0
##                         crushed boxes         0       0       0       0      0
##                           crushed ctn         0       0       0       0      0
##     CRYSTAL CHANDELIER T-LIGHT HOLDER         0       0       0       0      0
##       CRYSTAL CZECH CROSS PHONE CHARM         0       0       0       0      0
##      CRYSTAL DIAMANTE EXPANDABLE RING         0       0       0       0      0
##          CRYSTAL DIAMANTE STAR BROOCH         0       0       0       0      0
##              CRYSTAL FROG PHONE CHARM         0       0       0       0      0
##      CRYSTAL HOOP EARRING FLORAL LEAF         0       0       0       0      0
##        CRYSTAL PAIR HEART HAIR SLIDES         0       0       0       0      0
##         CRYSTAL SEA HORSE PHONE CHARM         0       0       0       0      0
##          CRYSTAL STILETTO PHONE CHARM         0       0       0       0      0
##    CRYSTAL STUD EARRINGS ASSORTED COL         0       0       0       0      0
##   CRYSTAL STUD EARRINGS CLEAR DISPLAY         0       0       0       0      0
##         CUBIC MUG FLOCK BLUE ON BROWN         0       0       0       0      0
##         CUBIC MUG FLOCK PINK ON BROWN         0       0       0       0      0
##               CUBIC MUG PINK POLKADOT         0       0       0       0      0
##         CUPBOARD 3 DRAWER MA CAMPAGNE         0       0       0       0      0
##              CUPCAKE LACE PAPER SET 6         0       0       0       0      0
##          CUPID DESIGN SCENTED CANDLES         0       0       0       0      0
##         CUPID SCENTED CANDLE IN GLASS         0       0       0       0      0
##          CURIO CABINET LINEN AND LACE         0       0       0       0      0
##          CURIOUS  IMAGES NOTEBOOK SET         0       0       0       0      0
##          CURIOUS IMAGES GIFT WRAP SET         0       0       0       0      0
##         CURIOUS IMAGES SCRAP BOOK SET         0       0       0       0      0
##         CUSHION COVER PINK UNION JACK         4       0       0       0      0
##      CUT GLASS HEXAGON T-LIGHT HOLDER         0       0       0       0      0
##      CUT GLASS T-LIGHT HOLDER OCTAGON         0       0       0       0      0
##              CUTE BIRD CEATURE SCREEN         0       0       0       0      0
##                        CUTE CATS TAPE         0       0       0       2      0
##            CUTE RABBIT CEATURE SCREEN         0       0       0       0      0
##            Dad's Cab Electronic Meter         0       0       0       0      0
##                               Dagamed         0       0       0       0      0
##              DAIRY MAID  PUDDING BOWL         0       0       0       0      0
##             DAIRY MAID LARGE MILK JUG         0       0       0       0      0
##                 DAIRY MAID STRIPE MUG         0       0       0       0      0
##                  DAIRY MAID TOASTRACK         0       0       0       0      0
##         DAIRY MAID TRADITIONAL TEAPOT         0       0       0       0      0
##            DAISIES  HONEYCOMB GARLAND         1       0       0       0      0
##        DAISY FOLKART HEART DECORATION         0       0       0       0      0
##                   DAISY GARDEN MARKER         0       0       0       0      0
##                       DAISY HAIR BAND         0       0       0       0      0
##                       DAISY HAIR COMB         0       0       0       0      0
##                         DAISY JOURNAL         0       0       0       0      0
##                        DAISY NOTEBOOK         0       0       0       0      0
##                      DAISY SKETCHBOOK         0       0       0       0      0
##                               damaged         0       0       0       0      0
##                               Damaged         0       0       0       0      0
##                               DAMAGED         0       0       0       0      0
##                         damaged stock         0       0       0       0      0
##                               damages         0       0       0       0      0
##                               Damages         0       0       0       0      0
##                           damages wax         0       0       0       0      0
##                              damages?         0       0       0       0      0
##            damages/credits from ASOS.         0       0       0       0      0
##                       damages/display         0       0       0       0      0
##                       damages/dotcom?         0       0       0       0      0
##                       Damages/samples         0       0       0       0      0
##                  damages/showroom etc         0       0       0       0      0
##           DANISH ROSE BEDSIDE CABINET         0       0       0       1      0
##          DANISH ROSE DECORATIVE PLATE         0       0       0       0      0
##            DANISH ROSE DELUXE COASTER         0       0       0       0      0
##             DANISH ROSE FOLDING CHAIR         0       0       0       0      0
##               DANISH ROSE PHOTO FRAME         0       0       0       0      0
##          DANISH ROSE ROUND SEWING BOX         0       0       0       1      0
##             DANISH ROSE TRINKET TRAYS         0       0       0       1      0
##            DANISH ROSE UMBRELLA STAND         0       0       0       0      0
##       DARK BIRD HOUSE TREE DECORATION         0       1       0       0      0
##   DECORATION  BUTTERFLY  MAGIC GARDEN         0       0       0       0      0
##   DECORATION  PINK CHICK MAGIC GARDEN         0       0       0       1      0
##    DECORATION , WOBBLY CHICKEN, METAL         0       0       0       0      0
##    DECORATION , WOBBLY RABBIT , METAL         0       0       0       0      0
##       DECORATION HEN ON NEST, HANGING         0       0       0       0      0
##              DECORATION SITTING BUNNY         0       0       0       0      0
##   DECORATION WHITE CHICK MAGIC GARDEN         0       0       0       0      0
##             DECORATION WOBBLY CHICKEN         0       0       0       0      0
##        DECORATION WOBBLY RABBIT METAL         0       0       0       0      0
##       DECORATIVE CATS BATHROOM BOTTLE         0       0       0       0      0
##      DECORATIVE FLORE BATHROOM BOTTLE         0       0       0       0      0
##      DECORATIVE HANGING SHELVING UNIT         0       0       0       0      0
##      DECORATIVE PLANT POT WITH FRIEZE         0       0       0       0      0
##       DECORATIVE ROSE BATHROOM BOTTLE         0       0       0       0      0
##        DECORATIVE VINTAGE COFFEE  BOX         0       0       0       0      0
##         DECORATIVE WICKER HEART LARGE         0       0       0       0      0
##        DECORATIVE WICKER HEART MEDIUM         0       0       0       0      0
##         DECORATIVE WICKER HEART SMALL         0       0       0       0      0
##              DECOUPAGE,GREETING CARD,         0       0       0       0      0
##   DECROTIVEVINTAGE COFFEE GRINDER BOX         0       0       0       0      0
##                     DELUXE SEWING KIT         2       0       0       0      0
##      DENIM PATCH PURSE PINK BUTTERFLY         0       0       0       0      0
##      DIAMANTE BOW BROOCH BLACK COLOUR         0       0       0       0      0
##      DIAMANTE BOW BROOCH GREEN COLOUR         0       0       0       0      0
##        DIAMANTE BOW BROOCH RED COLOUR         0       0       0       0      0
##   DIAMANTE HAIR GRIP PACK/2 BLACK DIA         0       0       0       0      0
##     DIAMANTE HAIR GRIP PACK/2 CRYSTAL         0       0       0       0      0
##     DIAMANTE HAIR GRIP PACK/2 LT ROSE         0       0       0       0      0
##     DIAMANTE HAIR GRIP PACK/2 MONTANA         0       0       0       0      0
##     DIAMANTE HAIR GRIP PACK/2 PERIDOT         0       0       0       0      0
##        DIAMANTE HAIR GRIP PACK/2 RUBY         0       0       0       0      0
##    DIAMANTE HEART SHAPED WALL MIRROR,         0       0       0       0      0
##                     DIAMANTE NECKLACE         0       0       0       0      0
##               DIAMANTE NECKLACE BLACK         0       0       0       0      0
##               DIAMANTE NECKLACE GREEN         0       0       0       0      0
##              DIAMANTE NECKLACE PURPLE         0       0       0       0      0
##        DIAMANTE RING ASSORTED IN BOX.         0       0       0       0      0
##       DIAMOND LAS VEGAS NECKLACE 45CM         0       0       0       0      0
##   did  a credit  and did not tick ret         0       0       0       0      0
##     DINOSAUR HEIGHT CHART STICKER SET         0       0       0       0      0
##            DINOSAUR KEYRINGS ASSORTED         0       0       0       1      0
##       DINOSAUR LUNCH BOX WITH CUTLERY         0       2       0       5      0
##      DINOSAUR PARTY BAG + STICKER SET         0       0       0       0      0
##                DINOSAURS  WRITING SET         0       0       0       0      0
##       DISCO BALL CHRISTMAS DECORATION         0       0       0       1      0
##   DISCO BALL ROTATOR BATTERY OPERATED         0       0       0       1      0
##                               Display         0       0       0       0      0
##     DO NOT TOUCH MY STUFF DOOR HANGER         0       0       0       0      0
##                 DOCTOR'S BAG SOFT TOY         1       0       0       0      0
##                 DOG AND BALL WALL ART         0       0       0       0      0
##          DOG BOWL CHASING BALL DESIGN         0       0       0       0      0
##                DOG BOWL VINTAGE CREAM         0       0       0       1      0
##                  DOG LICENCE WALL ART         1       0       0       0      0
##       DOG TOY WITH PINK CROCHET SKIRT         0       0       0       1      0
##                          DOGGY RUBBER         0       0       0       0      0
##                    DOILEY BISCUIT TIN         0       0       0       0      0
##                    DOILEY STORAGE TIN         3       1       0       3      0
##                  DOILY THANK YOU CARD         0       0       0       0      0
##               DOLLCRAFT BOY JEAN-PAUL         0       0       0       0      0
##                 DOLLCRAFT GIRL AMELIE         0       0       0       0      0
##             DOLLCRAFT GIRL AMELIE KIT         0       0       0       0      0
##                 DOLLCRAFT GIRL NICOLE         0       0       0       0      0
##               DOLLY CABINET 2 DRAWERS         0       0       0       0      0
##               DOLLY CABINET 3 DRAWERS         0       0       0       0      0
##              DOLLY GIRL BABY GIFT SET         0       3       0       7      0
##                     DOLLY GIRL BEAKER         1       1       0       5      0
##             DOLLY GIRL CHILDRENS BOWL         0       1       0       4      0
##              DOLLY GIRL CHILDRENS CUP         2       1       0       4      0
##          DOLLY GIRL CHILDRENS EGG CUP         0       0       0       2      0
##                  DOLLY GIRL LUNCH BOX         6       3       0      23      1
##              DOLLY GIRL MINI BACKPACK         2       1       0       5      0
##              DOLLY GIRL MINI RUCKSACK         0       0       0       0      0
##                   DOLLY GIRL WALL ART         0       0       0       0      0
##               DOLLY HONEYCOMB GARLAND         1       0       0       0      0
##     DOLLY MIXTURE CHILDREN'S UMBRELLA         0       1       0       0      0
##                      DOLPHIN WINDMILL         0       0       0       0      0
##                      DONKEY TAIL GAME         0       0       0       0      0
##          DOOR HANGER  MUM + DADS ROOM         0       0       0       0      0
##           DOORKNOB CRACKED GLAZE BLUE         0       0       0       0      0
##          DOORKNOB CRACKED GLAZE GREEN         0       0       0       0      0
##          DOORKNOB CRACKED GLAZE IVORY         0       0       0       0      0
##           DOORKNOB CRACKED GLAZE PINK         0       0       0       0      0
##                 DOORMAT 3 SMILEY CATS         0       0       0       0      0
##                       DOORMAT AIRMAIL         0       0       0       0      1
##                   DOORMAT BLACK FLOCK         0       0       0       0      0
##             DOORMAT CHRISTMAS VILLAGE         1       0       0       0      0
##                  DOORMAT ENGLISH ROSE         0       0       0       0      0
##                    DOORMAT FAIRY CAKE         0       1       0       2      0
##    DOORMAT FANCY FONT HOME SWEET HOME         0       0       0       0      0
##                    DOORMAT FRIENDSHIP         0       0       0       0      0
##                        DOORMAT HEARTS         1       0       0       1      0
##          DOORMAT HOME SWEET HOME BLUE         2       0       0       0      0
##                 DOORMAT I LOVE LONDON         0       0       0       0      0
##         DOORMAT KEEP CALM AND COME IN         3       0       0       0      0
##           DOORMAT MERRY CHRISTMAS RED         0       0       0       0      0
##            DOORMAT MULTICOLOUR STRIPE         0       0       0       0      0
##           DOORMAT NEIGHBOURHOOD WITCH         0       0       0       1      0
##                   DOORMAT NEW ENGLAND         0       0       0       0      0
##           DOORMAT PEACE ON EARTH BLUE         0       0       0       0      0
##                 DOORMAT RED RETROSPOT         4       0       0       6      0
##             DOORMAT RESPECTABLE HOUSE         0       0       0       0      0
##        DOORMAT SPOTTY HOME SWEET HOME         4       0       0       1      0
##                       DOORMAT TOPIARY         2       0       0       0      0
##                    DOORMAT UNION FLAG         7       0       0       0      0
##     DOORMAT UNION JACK GUNS AND ROSES         0       0       0       0      0
##                  DOORMAT VINTAGE LEAF         0       0       0       1      0
##         DOORMAT VINTAGE LEAVES DESIGN         1       0       0       1      0
##               DOORMAT WELCOME PUPPIES         0       1       0       1      0
##               DOORMAT WELCOME SUNRISE         0       0       0       0      0
##           DOORMAT WELCOME TO OUR HOME         4       0       0       2      0
##              DOORSTOP FOOTBALL DESIGN         0       0       0       0      0
##            DOORSTOP RACING CAR DESIGN         0       0       0       1      0
##              DOORSTOP RETROSPOT HEART         0       0       0       1      0
##                                dotcom         0       0       0       0      0
##                                Dotcom         0       0       0       0      0
##                         dotcom adjust         0       0       0       0      0
##                        DOTCOM POSTAGE         0       0       0       0      0
##                          dotcom sales         0       0       0       0      0
##                          Dotcom sales         0       0       0       0      0
##                            Dotcom set         0       0       0       0      0
##                    Dotcom sold in 6's         0       0       0       0      0
##                      dotcom sold sets         0       0       0       0      0
##   Dotcomgiftshop Gift Voucher £10.00         0       0       0       0      0
##  Dotcomgiftshop Gift Voucher £100.00         0       0       0       0      0
##   Dotcomgiftshop Gift Voucher £20.00         0       0       0       0      0
##   Dotcomgiftshop Gift Voucher £30.00         0       0       0       0      0
##   Dotcomgiftshop Gift Voucher £40.00         0       0       0       0      0
##   Dotcomgiftshop Gift Voucher £50.00         0       0       0       0      0
##              DOTCOMGIFTSHOP TEA TOWEL         0       0       0       0      0
##                           dotcomstock         0       0       0       0      0
##           DOUBLE CERAMIC PARLOUR HOOK         0       0       0       0      0
##                    DOUGHNUT LIP GLOSS         1       0       1       3      0
##          DOVE DECORATION PAINTED ZINC         0       0       0       0      0
##         Dr. Jam's Arouzer Stress Ball         0       0       0       0      0
##                 DRAGONS BLOOD INCENSE         0       0       0       0      0
##             DRAWER KNOB CERAMIC BLACK         1       0       0       0      0
##             DRAWER KNOB CERAMIC IVORY         0       0       0       0      0
##               DRAWER KNOB CERAMIC RED         0       0       0       0      0
##        DRAWER KNOB CRACKLE GLAZE BLUE         0       1       0       0      0
##       DRAWER KNOB CRACKLE GLAZE GREEN         0       1       0       0      0
##       DRAWER KNOB CRACKLE GLAZE IVORY         1       1       0       0      0
##        DRAWER KNOB CRACKLE GLAZE PINK         0       1       0       0      0
##        DRAWER KNOB VINTAGE GLASS BALL         0       0       0       0      0
##     DRAWER KNOB VINTAGE GLASS HEXAGON         0       0       0       0      0
##        DRAWER KNOB VINTAGE GLASS STAR         0       0       0       0      0
##   DROP DIAMANTE EARRINGS BLACK DIAMON         0       0       0       0      0
##        DROP DIAMANTE EARRINGS CRYSTAL         0       0       0       0      0
##          DROP DIAMANTE EARRINGS GREEN         0       0       0       0      0
##         DROP DIAMANTE EARRINGS PURPLE         0       0       0       0      0
##         DROP EARRINGS W FLOWER & LEAF         0       0       0       0      0
##        DUSTY PINK CHRISTMAS TREE 30CM         0       0       0       0      0
##        DUSTY PINK CHRISTMAS TREE 60CM         0       0       0       0      0
##       EASTER BUNNY GARLAND OF FLOWERS         0       0       0       0      0
##          EASTER BUNNY HANGING GARLAND         0       0       0       0      0
##      EASTER BUNNY WITH BASKET ON BACK         0       0       0       0      0
##                   EASTER BUNNY WREATH         0       0       0       0      0
##                 EASTER CRAFT 4 CHICKS         3       0       0       0      0
##    EASTER CRAFT IVY WREATH WITH CHICK         0       0       0       0      0
##           EASTER DECORATION EGG BUNNY         0       0       0       0      0
##       EASTER DECORATION HANGING BUNNY         0       0       0       0      0
##       EASTER DECORATION NATURAL CHICK         0       0       0       0      0
##       EASTER DECORATION SITTING BUNNY         0       0       0       0      0
##                     EASTER TIN BUCKET         0       0       0       1      0
##              EASTER TIN BUNNY BOUQUET         2       0       0       3      0
##           EASTER TIN CHICKS IN GARDEN         0       0       0       0      0
##          EASTER TIN CHICKS PINK DAISY         1       0       0       0      0
##                   EASTER TIN KEEPSAKE         1       0       0       0      0
##              EASTER TREE YELLOW BIRDS         0       0       0       0      0
##           EAU DE NIL LOVE BIRD CANDLE         0       0       0       0      0
##   EAU DE NILE HEART SHAPE PHOTO FRAME         0       0       0       0      0
##       EAU DE NILE JEWELLED PHOTOFRAME         0       0       0       0      0
##   EAU DE NILE JEWELLED T-LIGHT HOLDER         0       0       0       0      0
##                                  ebay         0       0       0       0      0
##                 ECONOMY HOLIDAY PURSE         0       0       0       0      0
##                   ECONOMY LUGGAGE TAG         0       0       0       0      0
##     EDWARDIAN DROP EARRINGS JET BLACK         0       0       0       0      0
##           EDWARDIAN HEART PHOTO FRAME         0       0       0       0      0
##               EDWARDIAN PARASOL BLACK         1       2       0       3      1
##             EDWARDIAN PARASOL NATURAL         0       2       0       0      1
##                EDWARDIAN PARASOL PINK         0       2       0       0      1
##                 EDWARDIAN PARASOL RED         0       2       0       2      1
##                 EDWARDIAN PHOTO FRAME         0       0       0       0      0
##           EGG CUP HENRIETTA HEN CREAM         0       0       0       0      0
##            EGG CUP HENRIETTA HEN PINK         0       0       0       0      0
##                EGG CUP MILKMAID HEIDI         0       0       0       1      0
##                EGG CUP MILKMAID HELGA         0       0       0       1      0
##               EGG CUP MILKMAID INGRID         0       0       0       0      0
##               EGG CUP NATURAL CHICKEN         0       0       0       0      0
##                   EGG FRYING PAN BLUE         0       0       0       0      0
##                  EGG FRYING PAN IVORY         0       0       0       0      0
##                   EGG FRYING PAN MINT         0       0       0       0      0
##                   EGG FRYING PAN PINK         0       0       0       0      0
##                    EGG FRYING PAN RED         0       0       0       0      0
##        EIGHT PIECE CREEPY CRAWLIE SET         0       0       0       0      0
##              EIGHT PIECE DINOSAUR SET         0       0       0       0      0
##                EIGHT PIECE SNAKE  SET         0       0       0       0      0
##                ELEPHANT BIRTHDAY CARD         0       0       0       0      0
##              ELEPHANT CARNIVAL POUFFE         0       0       0       0      0
##           ELEPHANT CLIP W SUCTION CUP         0       0       0       0      0
##              ELEPHANT, BIRTHDAY CARD,         1       0       0       0      0
##           ELVIS WALLHANGING / CURTAIN         0       0       0       0      0
##        EMBOSSED GLASS TEALIGHT HOLDER         0       0       0       0      0
##            EMBOSSED HEART TRINKET BOX         0       0       0       0      0
##        EMBROIDERED RIBBON REEL CLAIRE         1       0       0       1      0
##         EMBROIDERED RIBBON REEL DAISY         1       0       0       1      0
##         EMBROIDERED RIBBON REEL EMILY         0       0       0       1      0
##        EMBROIDERED RIBBON REEL RACHEL         1       0       0       0      0
##       EMBROIDERED RIBBON REEL REBECCA         0       0       0       1      0
##         EMBROIDERED RIBBON REEL ROSIE         1       0       0       0      0
##          EMBROIDERED RIBBON REEL RUBY         0       0       0       0      0
##         EMBROIDERED RIBBON REEL SALLY         0       0       0       0      0
##        EMBROIDERED RIBBON REEL SOPHIE         1       0       0       0      0
##         EMBROIDERED RIBBON REEL SUSIE         1       0       0       1      0
##               EMERGENCY FIRST AID TIN         0       0       0       1      1
##                  EMPIRE BIRTHDAY CARD         0       0       0       0      0
##                 EMPIRE DESIGN ROSETTE         0       0       0       0      0
##                      EMPIRE GIFT WRAP         0       0       0       0      0
##                     EMPIRE TISSUE BOX         0       0       0       0      0
##      EMPIRE UNION JACK TV DINNER TRAY         0       0       0       0      0
##           ENAMEL BLUE RIM BISCUIT BIN         0       0       0       0      0
##      ENAMEL BLUE RIM COFFEE CONTAINER         0       0       0       0      0
##         ENAMEL BLUE RIM TEA CONTAINER         0       0       0       0      0
##                    ENAMEL BOWL PANTRY         0       0       0       0      0
##                ENAMEL BREAD BIN CREAM         0       0       0       0      0
##                 ENAMEL COLANDER CREAM         0       0       0       0      0
##            ENAMEL DINNER PLATE PANTRY         0       0       0       0      0
##              ENAMEL FIRE BUCKET CREAM         0       0       0       0      0
##               ENAMEL FLOWER JUG CREAM         0       0       0       0      0
##                     ENAMEL JUG PANTRY         0       0       0       0      0
##            ENAMEL MEASURING JUG CREAM         2       0       0       0      0
##                     ENAMEL MUG PANTRY         0       0       0       0      0
##          ENAMEL PINK COFFEE CONTAINER         0       0       0       0      0
##             ENAMEL PINK TEA CONTAINER         0       0       0       0      0
##                ENAMEL WASH BOWL CREAM         0       0       0       0      0
##             ENAMEL WATERING CAN CREAM         0       0       0       0      0
##      ENCHANTED BIRD COATHANGER 5 HOOK         0       0       0       0      0
##             ENCHANTED BIRD PLANT CAGE         0       0       0       0      0
##         ENGLISH ROSE GARDEN SECATEURS         0       0       0       1      0
##         ENGLISH ROSE HOT WATER BOTTLE         0       0       0       1      0
##          ENGLISH ROSE METAL WASTE BIN         0       0       0       0      0
##         ENGLISH ROSE NOTEBOOK A6 SIZE         0       0       0       0      0
##         ENGLISH ROSE NOTEBOOK A7 SIZE         0       0       0       0      0
##   ENGLISH ROSE SCENTED HANGING FLOWER         0       0       0       0      0
##    ENGLISH ROSE SCENTED HANGING HEART         0       0       0       0      0
##     ENGLISH ROSE SMALL SCENTED FLOWER         0       0       0       0      0
##             ENGLISH ROSE SPIRIT LEVEL         0       0       0       0      0
##            ENVELOPE 50 BLOSSOM IMAGES         0       0       0       2      0
##            ENVELOPE 50 CURIOUS IMAGES         0       0       0       0      0
##           ENVELOPE 50 ROMANTIC IMAGES         0       0       0       0      0
##   ESSENTIAL BALM 3.5g TIN IN ENVELOPE         0       0       0       1      0
##                  ETCHED GLASS COASTER         0       0       0       0      0
##     ETCHED GLASS STAR TREE DECORATION         0       0       0       0      0
##         EUCALYPTUS & PINECONE  WREATH         0       0       0       0      0
##        FAIRY CAKE BIRTHDAY CANDLE SET         0       0       0       2      0
##            FAIRY CAKE DESIGN UMBRELLA         0       1       0       0      0
##    FAIRY CAKE FLANNEL ASSORTED COLOUR         0       1       0       3      0
##           FAIRY CAKE NOTEBOOK A5 SIZE         0       0       0       0      0
##          FAIRY CAKES NOTEBOOK A6 SIZE         0       0       0       2      0
##          FAIRY CAKES NOTEBOOK A7 SIZE         0       0       0       4      0
##                  FAIRY DREAMS INCENSE         0       0       0       0      0
##                FAIRY SOAP SOAP HOLDER         0       0       0       0      0
##        FAIRY TALE COTTAGE NIGHT LIGHT         2       0       0       0      0
##         FAIRY TALE COTTAGE NIGHTLIGHT         2       0       0       1      0
##      FAMILY ALBUM WHITE PICTURE FRAME         0       0       0       1      0
##            FAMILY PHOTO FRAME CORNICE         0       0       0       0      0
##                       FAN BLACK FRAME         0       0       0       0      0
##             FANCY FONT BIRTHDAY CARD,         0       0       0       0      0
##             FANCY FONTS BIRTHDAY WRAP         0       0       0       0      0
##           FANNY'S REST STOPMETAL SIGN         0       0       0       0      0
##                                faulty         0       0       0       0      0
##              FAUX FUR CHOCOLATE THROW         0       0       0       0      0
##       FAWN AND MUSHROOM GREETING CARD         0       0       0       0      0
##            FAWN BLUE HOT WATER BOTTLE         2       1       0       4      0
##                                   FBA         0       0       0       0      0
##                FEATHER PEN,COAL BLACK         0       0       0       0      0
##                  FEATHER PEN,HOT PINK         0       0       0       0      0
##                FEATHER PEN,LIGHT PINK         0       0       0       0      0
##             FELT EGG COSY BLUE RABBIT         0       0       0       0      0
##                 FELT EGG COSY CHICKEN         3       0       0       0      0
##                FELT EGG COSY LADYBIRD         0       0       0       0      0
##            FELT EGG COSY WHITE RABBIT         0       0       0       1      0
##              FELT FARM ANIMAL CHICKEN         0       0       0       0      0
##                  FELT FARM ANIMAL HEN         0       0       0       0      0
##               FELT FARM ANIMAL RABBIT         0       0       0       0      0
##                FELT FARM ANIMAL SHEEP         0       0       0       0      0
##          FELT FARM ANIMAL WHITE BUNNY         0       0       0       0      0
##                 FELT TOADSTOOL  SMALL         0       0       0       0      0
##                  FELT TOADSTOOL LARGE         0       0       0       0      0
##            FELTCRAFT 6 FLOWER FRIENDS         0       0       0       0      0
##           FELTCRAFT BOY JEAN-PAUL KIT         0       1       0       1      0
##            FELTCRAFT BUTTERFLY HEARTS         3       0       0       1      0
##             FELTCRAFT CHRISTMAS FAIRY         1       2       0       2      0
##           FELTCRAFT CUSHION BUTTERFLY         0       0       0       0      0
##                 FELTCRAFT CUSHION OWL         0       0       0       0      0
##              FELTCRAFT CUSHION RABBIT         0       0       0       0      0
##                  FELTCRAFT DOLL EMILY         2       1       0       0      0
##                  FELTCRAFT DOLL MARIA         1       0       0       1      0
##                  FELTCRAFT DOLL MOLLY         4       1       0       1      0
##                  FELTCRAFT DOLL ROSIE         2       0       0       0      0
##             FELTCRAFT GIRL AMELIE KIT         0       0       0       1      0
##             FELTCRAFT GIRL NICOLE KIT         0       0       0       1      0
##      FELTCRAFT HAIRBAND PINK AND BLUE         0       0       0       0      0
##    FELTCRAFT HAIRBAND PINK AND PURPLE         0       0       0       0      0
##       FELTCRAFT HAIRBAND RED AND BLUE         0       0       0       0      0
##    FELTCRAFT HAIRBANDS PINK AND WHITE         0       0       0       1      0
##     FELTCRAFT PRINCESS CHARLOTTE DOLL         3       0       0       0      0
##          FELTCRAFT PRINCESS LOLA DOLL         2       0       0       1      0
##        FELTCRAFT PRINCESS OLIVIA DOLL         3       0       0       1      0
##               FENG SHUI PILLAR CANDLE         0       0       0       0      0
##               FILIGREE DIAMANTE CHAIN         0       0       0       0      0
##            FILIGREE DIAMANTE EARRINGS         0       0       0       0      0
##             FILIGREE HEART BIRD WHITE         0       0       0       0      0
##        FILIGREE HEART BUTTERFLY WHITE         0       0       0       0      0
##            FILIGREE HEART DAISY WHITE         0       0       0       0      0
##         FILIGRIS HEART WITH BUTTERFLY         0       0       0       0      0
##   FINE SILVER NECKLACE W PASTEL FLOWE         0       0       0       0      0
##                     FINE WICKER HEART         0       0       0       0      0
##    FIRE POLISHED GLASS BRACELET BLACK         0       0       0       0      0
##    FIRE POLISHED GLASS BRACELET GREEN         0       0       0       0      0
##   FIRE POLISHED GLASS BRACELET MONTAN         0       0       0       0      0
##      FIRE POLISHED GLASS BRACELET RED         0       0       0       0      0
##      FIRE POLISHED GLASS NECKL BRONZE         0       0       0       0      0
##        FIRE POLISHED GLASS NECKL GOLD         0       0       0       0      0
##       FIRE POLISHED GLASS NECKL GREEN         0       0       0       0      0
##                         FIRST AID TIN         0       0       0       0      1
##             FIRST CLASS HOLIDAY PURSE         0       0       0       0      0
##               FIRST CLASS LUGGAGE TAG         0       0       0       0      0
##            FIRST CLASS PASSPORT COVER         0       0       0       0      0
##          FIVE CATS HANGING DECORATION         0       0       0       0      0
##         FIVE HEART HANGING DECORATION         0       0       0       0      0
##                     FLAG OF ST GEORGE         0       0       0       0      0
##            FLAG OF ST GEORGE CAR FLAG         0       0       0       0      0
##               FLAG OF ST GEORGE CHAIR         0       0       0       0      0
##         FLAMES SUNGLASSES PINK LENSES         0       0       0       0      0
##       FLOOR CUSHION ELEPHANT CARNIVAL         0       0       0       0      0
##            FLOOR LAMP SHADE WOOD BASE         0       0       0       0      0
##                   FLORAL BATHROOM SET         0       0       0       0      0
##                   FLORAL BLUE MONSTER         0       0       0       0      0
##            FLORAL FOLK STATIONERY SET         2       0       0       1      0
##                   FLORAL PINK MONSTER         0       0       0       1      0
##                   FLORAL SOFT CAR TOY         0       0       0       0      0
##         FLOWER BLUE CLOCK WITH SUCKER         0       0       0       0      0
##      FLOWER BURST SILVER RING CRYSTAL         0       0       0       0      0
##          FLOWER FAIRY 5 DRAWER LINERS         0       0       0       0      0
##     FLOWER FAIRY 5 SUMMER DRAW LINERS         0       0       0       0      0
##          FLOWER FAIRY INCENSE BOUQUET         0       0       0       0      0
##   FLOWER FAIRY,5 SUMMER B'DRAW LINERS         0       0       0       0      0
##           FLOWER GARLAND NECKLACE RED         0       0       0       0      0
##   FLOWER GLASS GARLAND NECKL.36"BLACK         0       0       0       0      0
##    FLOWER GLASS GARLAND NECKL.36"BLUE         0       0       0       0      0
##   FLOWER GLASS GARLAND NECKL.36"GREEN         0       0       0       0      0
##   FLOWER GLASS GARLD NECKL36"AMETHYST         0       0       0       1      0
##   FLOWER GLASS GARLD NECKL36"TURQUOIS         0       0       0       0      0
##          FLOWER PURPLE CLOCK W/SUCKER         0       0       0       0      0
##       FLOWER PURPLE CLOCK WITH SUCKER         0       0       0       0      0
##                FLOWER SHOP DESIGN MUG         0       0       0       0      0
##         FLOWER VINE RAFFIA FOOD COVER         0       0       0       0      0
##                     FLOWERS  STICKERS         0       1       0       0      0
##     FLOWERS CHANDELIER T-LIGHT HOLDER         0       0       0       0      0
##       FLOWERS HANDBAG blue and orange         0       0       0       0      0
##                  FLOWERS TILE COASTER         0       0       0       0      0
##                     FLOWERS TILE HOOK         0       0       0       0      0
##          FLUTED ANTIQUE CANDLE HOLDER         0       0       0       0      0
##               FLYING PIG WATERING CAN         0       1       0       0      0
##     FOLDING BUTTERFLY MIRROR HOT PINK         0       0       0       0      0
##        FOLDING BUTTERFLY MIRROR IVORY         0       0       0       1      0
##          FOLDING BUTTERFLY MIRROR RED         0       0       0       5      0
##    FOLDING CAMPING SCISSOR W/KNIF & S         0       0       0       0      0
##               FOLDING MIRROR HOT PINK         0       0       0       0      0
##                  FOLDING MIRROR IVORY         0       0       0       0      0
##                    FOLDING MIRROR RED         0       0       0       0      0
##                     FOLDING SHOE TIDY         0       0       0       0      0
##   FOLDING UMBRELLA BLACKBLUE POLKADOT         1       0       0       0      0
##   FOLDING UMBRELLA CHOCOLATE POLKADOT         0       0       0       0      0
##       FOLDING UMBRELLA CREAM POLKADOT         0       0       0       0      0
##   FOLDING UMBRELLA PINKWHITE POLKADOT         0       0       0       0      0
##   FOLDING UMBRELLA RED/WHITE POLKADOT         1       0       0       0      0
##   FOLDING UMBRELLA WHITE/RED POLKADOT         0       0       0       0      0
##        FOLK ART GREETING CARD,pack/12         0       0       0       0      0
##   FOLK ART METAL HEART T-LIGHT HOLDER         0       0       0       0      0
##    FOLK ART METAL STAR T-LIGHT HOLDER         0       0       0       0      0
##    FOLK FELT HANGING MULTICOL GARLAND         0       0       0       0      0
##   FOLKART CHRISTMAS TREE T-LIGHT HOLD         0       0       0       0      0
##                 FOLKART CLIP ON STARS         0       0       0       0      0
##            FOLKART HEART NAPKIN RINGS         0       0       0       0      0
##    FOLKART STAR CHRISTMAS DECORATIONS         0       0       0       0      0
##      FOLKART ZINC HEART CHRISTMAS DEC         0       0       0       0      0
##       FOLKART ZINC STAR CHRISTMAS DEC         0       0       0       0      0
##       FOOD CONTAINER SET 3 LOVE HEART         1       0       0       2      0
##   FOOD COVER WITH BEADS , SET 2 SIZES         0       0       0       0      0
##           FOOD COVER WITH BEADS SET 2         1       0       0       0      0
##            FOOD/DRINK SPONGE STICKERS         0       0       0       0      0
##            FOOT STOOL HOME SWEET HOME         0       0       0       0      0
##              for online retail orders         0       0       0       0      0
##                  FORKED CACTUS CANDLE         0       0       0       0      0
##                                 found         0       0       0       0      0
##                                 Found         0       0       0       0      0
##                                 FOUND         0       0       0       0      0
##                             found box         0       0       0       0      0
##                       Found by jackie         0       0       0       0      0
##                        Found in w/hse         0       0       0       0      0
##              found some more on shelf         0       0       0       0      0
##            FOUR HOOK  WHITE LOVEBIRDS         0       0       0       0      0
##        FOUR RABBIT EASTER DECORATIONS         0       0       0       0      0
##         FRAPPUCINO SCARF KNITTING KIT         0       0       0       0      0
##          FREESTYLE CANVAS ART PICTURE         0       0       0       0      0
##       FRENCH BATHROOM SIGN BLUE METAL         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 0         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 1         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 2         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 3         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 4         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 5         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 6         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 7         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 8         0       0       0       0      0
##         FRENCH BLUE METAL DOOR SIGN 9         0       0       0       0      0
##        FRENCH BLUE METAL DOOR SIGN No         0       0       0       0      0
##               FRENCH CARRIAGE LANTERN         0       0       0       0      0
##       FRENCH CHATEAU LARGE FRUIT BOWL         0       0       0       0      0
##          FRENCH CHATEAU LARGE PLATTER         0       0       0       0      0
##           FRENCH CHATEAU OVAL PLATTER         0       0       0       0      0
##        FRENCH CHATEAU SMALL FRUITBOWL         0       0       0       0      0
##            FRENCH ENAMEL CANDLEHOLDER         0       1       0       0      0
##               FRENCH ENAMEL POT W LID         0       0       0       0      0
##          FRENCH ENAMEL UTENSIL HOLDER         0       0       0       0      0
##             FRENCH ENAMEL WATER BASIN         0       0       0       0      0
##           FRENCH FLORAL CUSHION COVER         2       0       0       2      0
##         FRENCH GARDEN SIGN BLUE METAL         0       0       0       0      0
##        FRENCH KITCHEN SIGN BLUE METAL         0       0       0       0      0
##          FRENCH LATTICE CUSHION COVER         1       0       0       1      0
##        FRENCH LAUNDRY SIGN BLUE METAL         0       0       0       0      0
##           FRENCH LAVENDER SCENT HEART         0       0       0       0      0
##          FRENCH PAISLEY CUSHION COVER         0       0       0       0      0
##   FRENCH STYLE EMBOSSED HEART CABINET         0       0       0       0      0
##      FRENCH STYLE STORAGE JAR BONBONS         1       0       0       0      0
##         FRENCH STYLE STORAGE JAR CAFE         0       0       0       0      0
##          FRENCH STYLE STORAGE JAR JAM         0       0       0       0      0
##         FRENCH TOILET SIGN BLUE METAL         0       0       0       0      0
##             FRENCH WC SIGN BLUE METAL         0       0       0       0      0
##        FRESHWATER PEARL BRACELET GOLD         0       0       0       0      0
##       FRESHWATER PEARL BRACELET IVORY         0       0       0       0      0
##         FRIDGE MAGNETS LA VIE EN ROSE         0       0       0       0      0
##   FRIDGE MAGNETS LES ENFANTS ASSORTED         0       0       0       1      0
##      FRIDGE MAGNETS US DINER ASSORTED         0       0       0       0      0
##                           FROG CANDLE         0       0       0       0      0
##                FROG KING WATERING CAN         0       0       0       0      0
##                      FROG SOCK PUPPET         0       0       0       0      0
##                    FROSTED WHITE BASE         0       0       0       0      0
##                 FRUIT SALAD BAG CHARM         0       0       0       0      0
##      FRUIT TREE AND BIRDS WALL PLAQUE         0       0       0       0      0
##              FRYING PAN BLUE POLKADOT         0       0       0       0      0
##              FRYING PAN PINK POLKADOT         0       0       0       0      0
##              FRYING PAN RED RETROSPOT         0       0       0       0      0
##                 FRYING PAN UNION FLAG         0       0       0       0      0
##          FULL ENGLISH BREAKFAST PLATE         1       0       0       0      0
##                        FUNKY DIVA PEN         0       0       0       1      0
##         FUNKY FLOWER PICNIC BAG FOR 4         0       0       0       0      0
##            FUNKY MONKEY CUSHION COVER         0       0       0       0      0
##          FUNKY MONKEY GIFT BAG MEDIUM         0       0       0       0      0
##                      FUNKY MONKEY MUG         0       0       0       0      0
##      FUNKY WASHING UP GLOVES ASSORTED         0       0       0       0      0
##       FUSCHIA FLOWER PURSE WITH BEADS         0       0       0       0      0
##               FUSCHIA RETRO BAR STOOL         0       0       0       0      0
##              FUSCHIA TABLE RUN FLOWER         0       0       0       0      0
##         FUSCHIA VOILE POINTY SHOE DEC         0       0       0       0      0
##        GAOLERS KEYS DECORATIVE GARDEN         1       0       0       0      0
##                        GARAGE KEY FOB         0       0       0       0      0
##                     GARDEN METAL SIGN         0       0       0       0      0
##                   GARDEN PATH JOURNAL         0       0       0       0      0
##                  GARDEN PATH NOTEBOOK         0       0       0       0      0
##               GARDEN PATH POCKET BOOK         0       0       0       0      0
##                GARDEN PATH SKETCHBOOK         0       0       0       1      0
##                GARDENERS KNEELING PAD         0       0       0       0      0
##     GARDENERS KNEELING PAD CUP OF TEA         2       1       0       0      0
##      GARDENERS KNEELING PAD KEEP CALM         3       1       0       1      0
##   GARDENIA 1 WICK MORRIS BOXED CANDLE         0       0       0       0      0
##   GARDENIA 3 WICK MORRIS BOXED CANDLE         0       0       0       0      0
##         GARLAND WITH HEARTS AND BELLS         0       0       0       0      0
##          GARLAND WITH STARS AND BELLS         0       0       0       0      0
##           GARLAND WOODEN HAPPY EASTER         0       0       0       0      0
##                GARLAND, VINTAGE BELLS         0       0       0       0      0
##    GEMSTONE CHANDELIER T-LIGHT HOLDER         0       0       0       0      0
##            GENTLEMAN SHIRT REPAIR KIT         1       0       0       0      0
##                  GEORGIAN TRINKET BOX         0       0       0       0      0
##          GIANT 50'S CHRISTMAS CRACKER         0       2       0       2      0
##       GIANT MEDINA STAMPED METAL BOWL         0       0       0       0      0
##                     GIFT BAG BIRTHDAY         0       0       0       0      0
##         GIFT BAG LARGE 50'S CHRISTMAS         0       0       0       0      0
##                   GIFT BAG LARGE SPOT         0       0       0       0      0
##      GIFT BAG LARGE VINTAGE CHRISTMAS         0       0       0       0      0
##           GIFT BAG PSYCHEDELIC APPLES         0       0       0       0      0
##        GIN & TONIC DIET GREETING CARD         0       0       0       0      0
##           GIN + TONIC DIET METAL SIGN         0       2       0       0      0
##         GIN AND TONIC DIET METAL SIGN         0       0       0       0      0
##                     GIN AND TONIC MUG         0       0       0       0      0
##         GINGERBREAD MAN COOKIE CUTTER         0       1       0       3      0
##             GINGHAM BABUSHKA DOORSTOP         0       0       0       0      0
##           GINGHAM HEART  DOORSTOP RED         0       0       0       0      0
##              GINGHAM HEART DECORATION         0       0       0       0      0
##          GINGHAM OVEN GLOVE RED HEART         0       0       0       0      0
##               GINGHAM RECIPE BOOK BOX         0       0       0       0      0
##                     GINGHAM ROSE WRAP         0       0       0       0      0
##                  GIRAFFE WOODEN RULER         2       1       0       0      0
##        GIRLS ALPHABET IRON ON PATCHES         0       0       0       0      0
##                       GIRLS PARTY BAG         0       0       0       0      0
##      GIRLS VINTAGE TIN SEASIDE BUCKET         1       0       0       2      0
##                   GIRLY PINK TOOL SET         0       0       0       0      0
##                            Given away         0       0       0       0      0
##                        GLAMOROUS  MUG         0       0       0       0      0
##                    GLASS  BEURRE DISH         0       0       0       0      0
##           GLASS  SONGBIRD STORAGE JAR         0       0       0       0      0
##        GLASS AND BEADS BRACELET IVORY         0       0       0       0      0
##   GLASS AND PAINTED BEADS BRACELET OL         0       0       0       0      0
##   GLASS AND PAINTED BEADS BRACELET TO         0       0       0       0      0
##        GLASS APOTHECARY BOTTLE ELIXIR         1       0       0       2      0
##       GLASS APOTHECARY BOTTLE PERFUME         1       0       0       1      0
##         GLASS APOTHECARY BOTTLE TONIC         1       0       0       1      0
##     GLASS BEAD HOOP EARRINGS AMETHYST         0       0       0       0      0
##        GLASS BEAD HOOP EARRINGS BLACK         0       0       0       0      0
##        GLASS BEAD HOOP EARRINGS GREEN         0       0       0       0      0
##      GLASS BEAD HOOP EARRINGS MONTANA         0       0       0       0      0
##     GLASS BEAD HOOP NECKLACE AMETHYST         0       0       0       0      0
##        GLASS BEAD HOOP NECKLACE BLACK         0       0       0       0      0
##        GLASS BEAD HOOP NECKLACE GREEN         0       0       0       0      0
##      GLASS BEAD HOOP NECKLACE MONTANA         0       0       0       0      0
##                  GLASS BELL JAR LARGE         0       0       0       0      0
##                  GLASS BELL JAR SMALL         0       0       0       0      0
##                     GLASS BON BON JAR         0       0       0       0      0
##                   GLASS BONNE JAM JAR         0       0       0       0      0
##            GLASS CAKE COVER AND PLATE         0       0       0       0      0
##              GLASS CHALICE BLUE SMALL         0       0       0       1      0
##            GLASS CHALICE GREEN  LARGE         0       0       0       0      0
##            GLASS CHALICE GREEN  SMALL         0       0       0       0      0
##                    GLASS CLOCHE LARGE         0       0       0       0      0
##                    GLASS CLOCHE SMALL         0       0       0       0      0
##            GLASS HEART T-LIGHT HOLDER         0       0       0       0      0
##     GLASS JAR DAISY FRESH COTTON WOOL         0       0       0       0      0
##          GLASS JAR DIGESTIVE BISCUITS         1       0       0       0      0
##       GLASS JAR ENGLISH CONFECTIONERY         1       0       0       0      0
##                GLASS JAR KINGS CHOICE         0       0       0       0      0
##                   GLASS JAR MARMALADE         1       0       0       1      0
##          GLASS JAR PEACOCK BATH SALTS         0       0       0       1      0
##            GLASS SONGBIRD STORAGE JAR         0       0       0       0      0
##      GLASS SPHERE CANDLE STAND MEDIUM         0       0       0       0      0
##     GLASS STAR FROSTED T-LIGHT HOLDER         0       0       0       0      0
##               GLASS TWIST BON BON JAR         0       0       0       0      0
##               GLITTER BUTTERFLY CLIPS         0       0       0       0      0
##               GLITTER CHRISTMAS HEART         0       0       0       0      0
##                GLITTER CHRISTMAS STAR         0       0       0       0      0
##                GLITTER CHRISTMAS TREE         0       0       0       0      0
##     GLITTER CHRISTMAS TREE WITH BELLS         0       0       0       0      0
##      GLITTER HANGING BUTTERFLY STRING         0       0       0       0      0
##              GLITTER HEART DECORATION         0       0       0       0      0
##      GLITTER HEART GARLAND WITH BELLS         0       0       0       0      0
##     GLITTER SNOW PEAR TREE DECORATION         0       0       0       0      0
##       GLITTER STAR GARLAND WITH BELLS         0       0       0       0      0
##                 GLOW IN DARK DOLPHINS         0       0       0       0      0
##                   GOLD APERITIF GLASS         0       0       0       0      0
##           GOLD COSMETIC BAG PINK STAR         0       0       0       0      0
##     GOLD COSMETICS BAG WITH BUTTERFLY         0       0       0       0      0
##             GOLD DIAMANTE STAR BROOCH         0       0       0       0      0
##              GOLD EAR MUFF HEADPHONES         0       0       0       0      0
##                    GOLD FABRIC MIRROR         0       0       0       0      0
##                    GOLD FISHING GNOME         0       0       0       0      0
##             GOLD FLOWER CUSHION COVER         0       0       0       0      0
##          GOLD M PEARL  ORBIT NECKLACE         0       0       0       0      0
##             GOLD M.O.P ORBIT BRACELET         0       0       0       0      0
##        GOLD M.O.P ORBIT DROP EARRINGS         0       0       0       0      0
##            GOLD M.O.P. ORBIT NECKLACE         0       0       0       0      0
##                GOLD MINI TAPE MEASURE         0       0       0       0      0
##      GOLD MUG BONE CHINA TREE OF LIFE         0       0       0       0      0
##                      GOLD PHOTO FRAME         0       0       0       0      0
##                  GOLD PRINT PAPER BAG         0       0       0       0      0
##      GOLD SCROLL GLASS T-LIGHT HOLDER         0       0       0       0      0
##                   GOLD STANDING GNOME         0       0       0       1      0
##                       GOLD TEDDY BEAR         0       0       0       0      0
##                          GOLD WASHBAG         0       0       0       0      0
##                      GOLD WINE GOBLET         0       0       0       0      0
##       GOLD/AMBER DROP EARRINGS W LEAF         0       0       0       0      0
##     GOLD/M.O.P PENDANT ORBIT NECKLACE         0       0       0       0      0
##                 GOLDIE LOOKING MIRROR         0       0       0       0      0
##                 GRAND CHOCOLATECANDLE         0       1       0       1      0
##        GRASS HOPPER WOODEN WALL CLOCK         1       0       0       0      0
##       GREEN  DIAMANTE PEN IN GIFT BOX         0       0       0       0      0
##    GREEN 3 PIECE POLKADOT CUTLERY SET         0       0       0       0      0
##            GREEN BIRDHOUSE DECORATION         0       0       0       0      0
##               GREEN BITTY LIGHT CHAIN         0       0       0       0      0
##        GREEN CAT FLORAL CUSHION COVER         0       0       0       0      0
##      GREEN CHRISTMAS TREE CARD HOLDER         0       0       0       0      0
##   GREEN CHRISTMAS TREE STRING 20LIGHT         0       0       0       0      0
##           GREEN CRYSTAL DROP EARRINGS         0       0       0       0      0
##   GREEN DRAWER KNOB ACRYLIC EDWARDIAN         0       0       0       0      0
##    GREEN DROP EARRINGS W BEAD CLUSTER         0       0       0       0      0
##      GREEN EASTER EGG HUNT START POST         0       0       0       0      0
##          GREEN ENAMEL FLOWER HAIR TIE         0       0       0       0      0
##              GREEN ENAMEL FLOWER RING         0       0       0       0      0
##          GREEN ENAMEL+GLASS HAIR COMB         0       0       0       0      0
##                    GREEN FERN JOURNAL         0       0       0       0      0
##                   GREEN FERN NOTEBOOK         0       0       0       0      0
##                GREEN FERN POCKET BOOK         0       0       0       0      0
##                 GREEN FERN SKETCHBOOK         0       0       0       0      0
##                     GREEN GEISHA GIRL         0       0       0       0      0
##        GREEN GIANT GARDEN THERMOMETER         0       0       0       0      0
##          GREEN GLASS TASSLE BAG CHARM         0       0       0       0      0
##    GREEN GOOSE FEATHER CHRISTMAS TREE         0       0       0       0      0
##         GREEN GOOSE FEATHER TREE 60CM         0       0       0       0      0
##            GREEN HEART COMPACT MIRROR         0       0       0       0      0
##         GREEN HEART OF GLASS BRACELET         0       0       0       0      0
##         GREEN JUICY FRUIT PHOTO FRAME         0       0       0       0      0
##    GREEN LEAVES AND BEADS PHONE CHARM         0       0       0       0      0
##         GREEN METAL BOX ARMY SUPPLIES         0       0       0       0      0
##            GREEN METAL BOX TOP SECRET         0       0       0       0      0
##            GREEN METAL SWINGING BUNNY         0       0       0       0      0
##           GREEN MURANO TWIST BRACELET         0       0       0       0      0
##           GREEN MURANO TWIST NECKLACE         0       0       0       0      0
##          GREEN PAIR HEART HAIR SLIDES         0       0       0       0      0
##          GREEN PENDANT SHELL NECKLACE         0       0       0       0      0
##   GREEN PENDANT TRIPLE SHELL NECKLACE         0       0       0       0      0
##             GREEN PEONY CUSHION COVER         0       0       0       0      0
##                   GREEN POLKADOT BOWL         0       1       0       3      0
##                  GREEN POLKADOT PLATE         1       2       0       2      0
##       GREEN POP ART MAO CUSHION COVER         0       0       0       0      0
##       GREEN REGENCY TEACUP AND SAUCER         4       1       1       1      1
##                    GREEN ROSE WASHBAG         0       0       0       0      0
##            GREEN ROUND COMPACT MIRROR         0       0       0       0      0
##           GREEN SQUARE COMPACT MIRROR         0       0       0       0      0
##          GREEN STONE/CRYSTAL EARRINGS         0       0       0       0      0
##             GREEN SWEETHEART BRACELET         0       0       0       0      0
##                GREEN VINTAGE EARRINGS         0       0       0       0      0
##             GREEN VINTAGE SPOT BEAKER         1       1       0       0      0
##     GREEN WIRE STANDING CANDLE HOLDER         0       0       0       0      0
##            GREEN WITH METAL BAG CHARM         0       0       0       0      0
##      GREEN/BLUE CERAMIC CANDLE HOLDER         0       0       0       0      0
##      GREEN/BLUE FLOWER DESIGN BIG MUG         0       0       0       0      0
##      GREETING CARD, OVERCROWDED POOL.         0       0       0       0      0
##          GREETING CARD, STICKY GORDON         0       0       0       0      0
##           GREETING CARD, TWO SISTERS.         0       0       0       0      0
##       GREETING CARD,SQUARE, DOUGHNUTS         0       0       0       0      0
##           GREY ACRYLIC FACETED BANGLE         0       0       0       0      0
##    GREY FLORAL FELTCRAFT SHOULDER BAG         0       0       0       0      0
##           GREY HEART HOT WATER BOTTLE         0       2       0       0      0
##              GROOVY CACTUS INFLATABLE         0       0       0       0      0
##    GROW A FLYTRAP OR SUNFLOWER IN TIN         0       1       1       0      0
##     GROW YOUR OWN BASIL IN ENAMEL MUG         0       1       0       0      0
##        GROW YOUR OWN FLOWERS SET OF 3         0       1       0       0      0
##          GROW YOUR OWN HERBS SET OF 3         0       0       0       0      0
##          GROW YOUR OWN PLANT IN A CAN         0       0       0       0      0
##                     GUMBALL COAT RACK         1       1       0       6      0
##                 GUMBALL MAGAZINE RACK         0       0       0       0      0
##          GUMBALL MONOCHROME COAT RACK         0       0       0       0      0
##            GYMKHANA TREASURE BOOK BOX         2       0       0       0      0
##           GYMKHANNA TREASURE BOOK BOX         0       0       0       0      0
##                    had been put aside         0       0       0       0      0
##                   Had been put aside.         0       0       0       0      0
##     HAIRCLIPS FORTIES FABRIC ASSORTED         0       0       0       1      0
##           HALL CABINET WITH 3 DRAWERS         0       0       0       0      0
##            HAND OPEN SHAPE DECO.WHITE         0       0       0       0      0
##                  HAND OPEN SHAPE GOLD         0       0       0       0      0
##        HAND OVER THE CHOCOLATE   SIGN         1       0       0       0      0
##       HAND PAINTED HANGING EASTER EGG         0       0       0       0      0
##        HAND TOWEL PALE BLUE W FLOWERS         0       0       0       0      0
##      HAND TOWEL PINK FLOWER AND DAISY         0       0       0       0      0
##           HAND WARMER BABUSHKA DESIGN         0       0       0       0      0
##               HAND WARMER BIRD DESIGN         0       0       0       0      0
##                HAND WARMER OWL DESIGN         0       0       0       1      0
##            HAND WARMER RED LOVE HEART         0       0       0       0      0
##             HAND WARMER RED POLKA DOT         0       0       0       0      0
##             HAND WARMER RED RETROSPOT         0       0       0       1      0
##         HAND WARMER SCOTTY DOG DESIGN         0       0       0       0      0
##                HAND WARMER UNION JACK         0       0       0       0      0
##     HANGING  BUTTERFLY T-LIGHT HOLDER         0       0       0       0      0
##   HANGING BAUBLE T-LIGHT HOLDER LARGE         0       0       0       0      0
##   HANGING BAUBLE T-LIGHT HOLDER SMALL         0       0       0       0      0
##                HANGING BUTTERFLY  EGG         0       0       0       0      0
##      HANGING CHICK  YELLOW DECORATION         0       0       0       0      0
##        HANGING CHICK CREAM DECORATION         0       0       0       0      0
##        HANGING CHICK GREEN DECORATION         0       0       0       0      0
##             HANGING CLEAR MINI BOTTLE         2       0       0       0      0
##          HANGING ENGRAVED METAL HEART         0       0       0       0      0
##         HANGING FAIRY CAKE DECORATION         0       0       0       1      0
##         HANGING GLASS ETCHED TEALIGHT         0       0       0       0      0
##                  HANGING HEART BASKET         0       0       0       0      0
##                 HANGING HEART BONHEUR         0       0       0       1      0
##      HANGING HEART JAR T-LIGHT HOLDER         7       0       0       0      0
##       HANGING HEART MIRROR DECORATION         0       0       0       0      0
##               HANGING HEART WITH BELL         0       0       0       0      0
##     HANGING HEART ZINC T-LIGHT HOLDER         2       0       0       0      0
##        HANGING HEN ON NEST DECORATION         0       0       0       0      0
##        HANGING JAM JAR T-LIGHT HOLDER         2       0       0       0      0
##       HANGING JAM JAR T-LIGHT HOLDERS         0       0       0       1      0
##          HANGING MEDINA LANTERN SMALL         0       0       0       0      0
##      HANGING METAL CHICKEN DECORATION         0       0       0       0      0
##           HANGING METAL HEART LANTERN         0       0       0       0      0
##       HANGING METAL RABBIT DECORATION         0       0       0       0      0
##            HANGING METAL STAR LANTERN         0       0       0       0      0
##         HANGING MINI COLOURED BOTTLES         2       0       0       0      0
##        HANGING PHOTO CLIP ROPE LADDER         0       0       0       0      0
##      HANGING QUILTED PATCHWORK APPLES         1       0       0       0      0
##    HANGING RIDGE GLASS T-LIGHT HOLDER         0       0       0       0      0
##       HANGING SPRING FLOWER EGG LARGE         0       0       0       0      0
##       HANGING SPRING FLOWER EGG SMALL         0       0       0       0      0
##       HANGING WOOD AND FELT BUTTERFLY         0       0       0       0      0
##          HANGING WOOD AND FELT FLOWER         0       0       0       0      0
##           HANGING WOOD AND FELT HEART         0       0       0       0      0
##     HAPPY BIRTHDAY CARD STRIPEY TEDDY         0       0       0       0      0
##        HAPPY BIRTHDAY CARD TEDDY/CAKE         0       0       0       0      0
##       HAPPY EASTER HANGING DECORATION         0       0       0       0      0
##                   HAPPY STENCIL CRAFT         0       0       0       0      0
##                HARDMAN MUG 3 ASSORTED         0       0       0       0      0
##                  HAWAIIAN GRASS SKIRT         0       0       0       0      0
##            HAYNES CAMPER SHOULDER BAG         0       0       0       0      0
##          HEADS AND TAILS SPORTING FUN         0       0       0       1      0
##       HEART BEADED TRELLIS DECORATION         0       0       0       0      0
##           HEART BUTTONS JEWELLERY BOX         0       0       0       0      0
##                      HEART CALCULATOR         0       0       0       1      0
##         HEART DECORATION PAINTED ZINC         0       0       0       0      0
##       HEART DECORATION RUSTIC HANGING         0       0       0       0      0
##          HEART DECORATION WITH PEARLS         0       0       0       0      0
##            HEART FILIGREE DOVE  SMALL         0       0       0       0      0
##             HEART FILIGREE DOVE LARGE         0       0       0       0      0
##           HEART GARLAND RUSTIC PADDED         0       0       0       0      0
##             HEART IVORY TRELLIS LARGE         0       0       0       0      0
##             HEART IVORY TRELLIS SMALL         0       0       0       0      0
##             HEART MINI PORTRAIT FRAME         0       0       0       0      0
##            HEART MIRROR ANTIQUE WHITE         0       0       0       0      0
##                 HEART OF WICKER LARGE         0       0       0       0      0
##                 HEART OF WICKER SMALL         0       0       0       0      0
##         HEART SHAPE WIRELESS DOORBELL         0       0       0       0      0
##             HEART SHAPED HOLLY WREATH         1       1       0       0      0
##                   HEART SHAPED MIRROR         0       0       0       0      0
##      HEART STRING MEMO HOLDER HANGING         0       0       0       0      0
##                  HEART T-LIGHT HOLDER         0       0       0       0      0
##    HEART T-LIGHT HOLDER WILLIE WINKIE         0       0       0       0      0
##   HEART TRELLIS TRIPLE T-LIGHT HOLDER         0       0       0       0      0
##    HEART TRELLISTRIPLE T-LIGHT HOLDER         0       0       0       0      0
##     HEART WOODEN CHRISTMAS DECORATION         0       0       0       1      0
##     HEART WREATH DECORATION WITH BELL         0       0       0       0      0
##                      HEARTS  STICKERS         0       0       0       0      0
##                      HEARTS GIFT TAPE         0       0       0       1      0
##                  HEARTS WRAPPING TAPE         0       0       0       0      0
##    HEAVENS SCENT FRAGRANCE OILS ASSTD         0       0       0       0      0
##             HELLO SAILOR BATHROOM SET         0       0       0       0      0
##         HELLO SAILOR BLUE SOAP HOLDER         0       0       0       0      0
##                  HEN HOUSE DECORATION         0       0       0       0      0
##             HEN HOUSE W CHICK IN NEST         0       0       0       0      0
##            HEN HOUSE W CHICK STANDING         1       0       0       0      0
##     HEN HOUSE W FAMILY IN BARN & NEST         0       0       0       0      0
##         HEN HOUSE WITH CHICK STANDING         0       0       0       0      0
##         HEN PARTY CORDON BARRIER TAPE         0       0       0       0      0
##                     HENRIETTA HEN MUG         0       0       0       1      0
##                     HERB MARKER BASIL         1       0       0       0      0
##                    HERB MARKER CHIVES         1       0       0       0      0
##                      HERB MARKER MINT         1       0       0       0      0
##                   HERB MARKER PARSLEY         1       0       0       0      0
##                  HERB MARKER ROSEMARY         1       0       0       0      0
##                     HERB MARKER THYME         1       0       0       0      0
##             HI TEC ALPINE HAND WARMER         0       0       0       0      0
##                 High Resolution Image         0       0       0       0      0
##               HILDA CANDY SPOT RABBIT         0       0       0       0      0
##         HIPPY CHIC DECORATIVE PARASOL         0       0       0       0      0
##   historic computer difference?....se         0       0       0       0      0
##                      HOLIDAY FUN LUDO         0       0       0       0      0
##          HOLLY TOP CHRISTMAS STOCKING         0       0       0       0      0
##              HOME BUILDING BLOCK WORD         0       0       0       0      0
##             HOME GARLAND PAINTED ZINC         0       0       0       0      0
##               HOME SMALL WOOD LETTERS         0       0       0       0      0
##         HOME SWEEET HOME 3 PEG HANGER         0       0       0       0      0
##      HOME SWEET HOME 2 DRAWER CABINET         0       0       0       0      0
##          HOME SWEET HOME 3 PEG HANGER         0       0       0       0      0
##            HOME SWEET HOME BLACKBOARD         0       0       0       0      0
##                HOME SWEET HOME BOTTLE         0       0       0       0      0
##         HOME SWEET HOME CUSHION COVER         0       0       0       0      0
##         HOME SWEET HOME HANGING HEART         0       0       0       0      0
##                  HOME SWEET HOME HOOK         0       0       0       0      0
##            HOME SWEET HOME KEY HOLDER         0       0       0       0      0
##            HOME SWEET HOME METAL SIGN         3       0       0       0      0
##                   HOME SWEET HOME MUG         1       0       0       0      0
##          HOMEMADE JAM SCENTED CANDLES         5       0       0       3      0
##          HOOK, 1 HANGER ,MAGIC GARDEN         1       0       0       1      0
##                 HORSE & PONY WALL ART         1       0       0       0      0
##                  HOT BATHS METAL SIGN         0       0       0       0      0
##                 HOT BATHS SOAP HOLDER         0       0       0       0      0
##            HOT STUFF HOT WATER BOTTLE         0       0       0       1      0
##             HOT WATER BOTTLE BABUSHKA         0       0       0       0      0
##       HOT WATER BOTTLE BABUSHKA LARGE         0       0       0       0      0
##       HOT WATER BOTTLE I AM SO POORLY         3       0       0       0      0
##            HOT WATER BOTTLE KEEP CALM         1       0       0       0      0
##             HOT WATER BOTTLE SEX BOMB         0       0       0       0      0
##     HOT WATER BOTTLE TEA AND SYMPATHY         0       1       0       0      0
##          HOUSE SHAPE PENCIL SHARPENER         0       0       0       0      0
##             HOUSE WRECKING METAL SIGN         0       0       0       0      0
##         HYACINTH BULB T-LIGHT CANDLES         0       0       0       0      0
##      I CAN ONLY PLEASE ONE PERSON MUG         0       0       0       0      0
##           I LOVE LONDON BABY GIFT SET         1       0       0       1      0
##                  I LOVE LONDON BEAKER         1       0       0       0      0
##           I LOVE LONDON MINI BACKPACK         1       0       0       1      0
##           I LOVE LONDON MINI RUCKSACK         0       0       0       0      0
##                I LOVE LONDON WALL ART         0       0       0       0      0
##             I'M ON HOLIDAY METAL SIGN         0       0       0       0      0
##                     ICE CREAM BUBBLES         1       0       0       0      0
##       ICE CREAM DESIGN GARDEN PARASOL         0       0       0       0      0
##               ICE CREAM PEN LIP GLOSS         0       0       0       1      0
##            ICE CREAM SUNDAE LIP GLOSS         0       1       1       2      0
##                ICON MUG REVOLUTIONARY         0       0       0       0      0
##           ICON PLACEMAT POP ART ELVIS         0       0       0       1      0
##       IF YOU CAN'T STAND THE HEAT MUG         0       0       0       0      0
##                  ILLUSTRATED CAT BOWL         0       0       0       0      0
##                  INCENSE BAZAAR PEACH         0       0       0       0      0
##                incorrect stock entry.         0       0       0       0      0
##                Incorrect stock entry.         0       0       0       0      0
##   incorrectly credited C550456 see 47         0       0       0       0      0
##         incorrectly made-thrown away.         0       0       0       0      0
##       incorrectly put back into stock         0       0       0       0      0
##            INFLATABLE POLITICAL GLOBE         0       0       0       0      0
##               IVORY CAFE HANGING LAMP         0       0       0       0      0
##       IVORY CHANDELIER T-LIGHT HOLDER         0       0       0       0      0
##                IVORY DINER WALL CLOCK         3       0       0       2      0
##               IVORY EMBROIDERED QUILT         0       0       0       0      0
##       IVORY ENCHANTED FOREST PLACEMAT         1       0       0       0      0
##        IVORY GIANT GARDEN THERMOMETER         1       0       0       0      0
##            IVORY GOLD METAL BAG CHARM         0       0       0       0      0
##        IVORY HANGING DECORATION  BIRD         0       0       0       0      0
##         IVORY HANGING DECORATION  EGG         0       0       0       0      0
##       IVORY HANGING DECORATION  HEART         0       0       0       0      0
##                  IVORY KITCHEN SCALES         0       0       0      12      0
##                IVORY KNITTED MUG COSY         3       0       0       0      0
##                IVORY LOVE BIRD CANDLE         0       0       0       1      0
##             IVORY PANTRY HANGING LAMP         0       0       0       0      0
##            IVORY PAPER CUP CAKE CASES         0       0       0       1      0
##   IVORY PENDANT TRIPLE SHELL NECKLACE         0       0       0       0      0
##        IVORY PILLAR CANDLE GOLD FLOCK         0       0       0       0      0
##      IVORY PILLAR CANDLE SILVER FLOCK         0       0       0       0      0
##                 IVORY REFECTORY CLOCK         0       0       0       2      0
##        IVORY RETRO KITCHEN WALL CLOCK         0       0       0       0      0
##             IVORY SCULPTED RND CANDLE         0       0       0       0      0
##            IVORY SHELL HEART EARRINGS         0       0       0       0      0
##            IVORY SHELL HEART NECKLACE         0       0       0       0      0
##        IVORY STRING CURTAIN WITH POLE         1       0       0       0      0
##            IVORY SWEETHEART SOAP DISH         0       1       0       0      0
##     IVORY SWEETHEART WIRE LETTER RACK         0       1       0       0      0
##              IVORY WICKER HEART LARGE         0       0       0       0      0
##             IVORY WICKER HEART MEDIUM         0       0       0       0      0
##              IVORY WICKER HEART SMALL         0       0       0       0      0
##          IVORY WIRE KITCHEN ORGANISER         0       1       0       0      0
##     IVORY WIRE SWEETHEART LETTER TRAY         0       0       0       0      0
##                      IVY HEART WREATH         0       0       0       0      0
##           JADE CRYSTAL+GLASS BRACELET         0       0       0       0      0
##         JADE DROP EARRINGS W FILIGREE         0       0       0       0      0
##           JADE GREEN ENAMEL HAIR COMB         0       0       0       0      0
##                      JAM CLOCK MAGNET         0       0       0       0      1
##                 JAM JAR WITH BLUE LID         0       0       0       0      0
##                JAM JAR WITH GREEN LID         2       1       0       0      0
##                 JAM JAR WITH PINK LID         2       1       0       3      0
##                JAM MAKING SET PRINTED         2       2       0       3      0
##              JAM MAKING SET WITH JARS         6       2       0       2      0
##       JARDIN ETCHED GLASS BUTTER DISH         0       0       0       0      0
##       JARDIN ETCHED GLASS CHEESE DISH         0       0       0       0      0
##         JARDIN ETCHED GLASS FRUITBOWL         0       0       0       0      0
##    JARDIN ETCHED GLASS LARGE BELL JAR         0       0       0       0      0
##    JARDIN ETCHED GLASS SMALL BELL JAR         0       0       0       0      0
##                 JASMINE VOTIVE CANDLE         0       0       0       0      0
##              JAZZ HEARTS ADDRESS BOOK         0       0       0       0      0
##            JAZZ HEARTS PURSE NOTEBOOK         0       0       0       0      0
##    JET BLACK LAS VEGAS BRACELET ROUND         0       0       0       0      0
##     JET BLACK LAS VEGAS NECKLACE 45CM         0       0       0       0      0
##           JIGSAW RABBIT AND BIRDHOUSE         0       0       0       0      0
##             JIGSAW TOADSTOOLS 3 PIECE         1       0       0       1      0
##            JIGSAW TREE WITH BIRDHOUSE         0       0       0       0      0
##         JIGSAW TREE WITH WATERING CAN         0       0       0       0      0
##        JINGLE BELL HEART ANTIQUE GOLD         0       0       0       0      0
##      JINGLE BELL HEART ANTIQUE SILVER         0       0       0       0      0
##          JINGLE BELL HEART DECORATION         0       0       0       0      0
##          JINGLE BELLS TREE DECORATION         0       0       0       0      0
##                            John Lewis         0       0       0       0      0
##                JOY LARGE WOOD LETTERS         0       0       0       0      0
##              JOY WOODEN BLOCK LETTERS         0       0       0       0      0
##        JUMBO  BAG BAROQUE BLACK WHITE         1       0       0       1      0
##              JUMBO BAG 50'S CHRISTMAS         2       0       0       1      0
##                    JUMBO BAG ALPHABET         3       0       0       2      0
##                      JUMBO BAG APPLES         1       1       0       7      0
##       JUMBO BAG CHARLIE AND LOLA TOYS         0       0       0       0      0
##             JUMBO BAG DOILEY PATTERNS         2       0       0       3      0
##           JUMBO BAG DOLLY GIRL DESIGN         0       0       0       2      0
##                        JUMBO BAG OWLS         1       2       0       2      0
##                JUMBO BAG PAISLEY PARK         0       0       0       0      0
##                       JUMBO BAG PEARS         1       0       0       2      0
##               JUMBO BAG PINK POLKADOT         1       0       0       2      0
##        JUMBO BAG PINK VINTAGE PAISLEY         3       1       0       2      0
##               JUMBO BAG RED RETROSPOT         4       1       0      10      0
##   JUMBO BAG SCANDINAVIAN BLUE PAISLEY         0       0       0       0      0
##        JUMBO BAG SCANDINAVIAN PAISLEY         0       0       0       1      0
##             JUMBO BAG SPACEBOY DESIGN         2       1       0       5      0
##                  JUMBO BAG STRAWBERRY         0       0       0       5      0
##                        JUMBO BAG TOYS         1       0       0       0      0
##           JUMBO BAG VINTAGE CHRISTMAS         1       0       0       0      0
##              JUMBO BAG VINTAGE DOILEY         0       0       0       0      0
##               JUMBO BAG VINTAGE DOILY         1       0       0       3      0
##                JUMBO BAG VINTAGE LEAF         3       0       0       5      0
##            JUMBO BAG WOODLAND ANIMALS         3       1       0       7      0
##     JUMBO SHOPPER VINTAGE RED PAISLEY         1       0       0       0      0
##              JUMBO STORAGE BAG SKULLS         0       0       0       0      0
##                JUMBO STORAGE BAG SUKI         1       1       0       4      0
##    JUNGLE POPSICLES ICE LOLLY HOLDERS         0       0       0       0      0
##     JUNGLE POPSICLES ICE LOLLY MOULDS         0       0       0       0      0
##               KEEP CALM BIRTHDAY WRAP         0       0       0       0      0
##                    KEEP CALM WALL ART         0       0       0       0      0
##             KEEP OUT BOYS DOOR HANGER         0       0       0       0      0
##            KEEP OUT GIRLS DOOR HANGER         0       0       0       0      0
##                 KENSINGTON COFFEE SET         0       0       0       0      0
##               KEY CABINET MA CAMPAGNE         0       0       0       0      0
##                   KEY FOB , BACK DOOR         0       0       0       0      0
##                 KEY FOB , FRONT  DOOR         1       0       0       0      0
##               KEY FOB , GARAGE DESIGN         1       0       0       0      0
##                        KEY FOB , SHED         1       0       0       0      0
##       KEY RING BASEBALL BOOT ASSORTED         0       0       0       0      0
##     KEY RING BASEBALL BOOT UNION JACK         0       0       0       0      0
##               KIDS CUTLERY DOLLY GIRL         0       0       0       0      0
##                 KIDS CUTLERY SPACEBOY         0       0       0       0      0
##                    KIDS RAIN MAC BLUE         0       2       0       0      0
##                    KIDS RAIN MAC PINK         0       2       0       0      0
##              KINGS CHOICE BISCUIT TIN         0       1       0       0      0
##       KINGS CHOICE GIANT TUBE MATCHES         0       0       0       0      0
##                      KINGS CHOICE MUG         0       1       0       0      0
##                KINGS CHOICE TEA CADDY         0       0       0       0      0
##       KITCHEN FLOWER POTS WALL PLAQUE         0       0       0       0      0
##                    KITCHEN METAL SIGN         0       0       0       0      0
##                KITTENS DESIGN FLANNEL         0       0       0       0      0
##                  KITTY PENCIL ERASERS         0       0       0       0      0
##        KNEELING MAT HOUSEWORK  DESIGN         0       0       0       0      0
##    KNICKERBOCKERGLORY MAGNET ASSORTED         1       1       0       0      0
##                   KNITTED RABBIT DOLL         0       0       0       0      0
##   KNITTED UNION FLAG HOT WATER BOTTLE         1       0       0       0      0
##     LA JARDIN BOTANIQUE CUSHION COVER         0       0       0       0      0
##              LA PALMIERA TILE COASTER         0       0       0       0      0
##                 LA PALMIERA TILE HOOK         0       0       0       0      0
##          LA PALMIERA WALL THERMOMETER         0       0       0       0      0
##                          label mix up         0       0       0       0      0
##         LADIES & GENTLEMEN METAL SIGN         0       0       0       0      0
##                 LADLE LOVE HEART PINK         0       0       0       0      0
##                  LADLE LOVE HEART RED         0       0       0       0      0
##                  LADS ONLY TISSUE BOX         0       0       0       0      0
##      LADYBIRD + BEE RAFFIA FOOD COVER         0       0       0       0      0
##           LANDMARK FRAME BAKER STREET         0       0       0       0      0
##            LANDMARK FRAME CAMDEN TOWN         0       0       0       0      0
##          LANDMARK FRAME COVENT GARDEN         0       0       0       0      0
##          LANDMARK FRAME LONDON BRIDGE         0       0       0       0      0
##           LANDMARK FRAME NOTTING HILL         0       0       0       0      0
##          LANDMARK FRAME OXFORD STREET         0       0       0       0      0
##                  LANTERN CREAM GAZEBO         0       0       0       0      0
##    LARGE  TALL CAMPHOR WOOD TOADSTOOL         0       0       0       0      0
##       LARGE ANTIQUE WHITE PHOTO FRAME         0       0       0       0      0
##        LARGE APOTHECARY MEASURING JAR         0       0       0       0      0
##     LARGE BLUE PROVENCAL CERAMIC BALL         0       0       0       0      0
##   LARGE BONNE JAM JAR  T-LIGHT HOLDER         2       0       0       0      0
##   LARGE CAKE STAND  HANGING STRAWBERY         0       0       0       0      0
##       LARGE CAKE STAND HANGING HEARTS         0       0       0       1      0
##      LARGE CAKE TOWEL CHOCOLATE SPOTS         0       0       0       1      0
##           LARGE CAKE TOWEL PINK SPOTS         0       0       0       1      0
##     LARGE CAKE TOWEL, CHOCOLATE SPOTS         0       0       0       0      0
##     LARGE CAMPHOR WOOD FIELD MUSHROOM         0       0       0       0      0
##         LARGE CERAMIC TOP STORAGE JAR         3       0       0       0      0
##           LARGE CHINESE STYLE SCISSOR         0       0       0       0      0
##          LARGE CIRCULAR MIRROR MOBILE         0       0       0       0      0
##      LARGE CRYSTAL DIAMANTE HAIRSLIDE         0       0       0       0      0
##            LARGE DECO JEWELLERY STAND         0       0       0       1      0
##   LARGE HANGING IVORY & RED WOOD BIRD         0       0       0       0      0
##              LARGE HEART FLOWERS HOOK         0       0       0       0      0
##          LARGE HEART MEASURING SPOONS         4       0       0       0      0
##      LARGE IVORY HEART WALL ORGANISER         0       0       0       0      0
##                 LARGE JEWELLERY STAND         0       0       0       0      0
##       LARGE MEDINA STAMPED METAL BOWL         0       0       0       0      0
##         LARGE MINT DIAMANTE HAIRSLIDE         0       0       0       0      0
##                   LARGE PARLOUR FRAME         0       0       0       0      0
##           LARGE PARLOUR PICTURE FRAME         0       0       0       0      0
##          LARGE PINK GLASS SUNDAE DISH         0       0       0       0      0
##                  LARGE POPCORN HOLDER         0       0       0       0      0
##        LARGE PURPLE BABUSHKA NOTEBOOK         0       0       0       1      0
##           LARGE RED BABUSHKA NOTEBOOK         0       0       0       1      0
##          LARGE RED RETROSPOT WINDMILL         0       0       0       3      0
##      LARGE ROUND CUTGLASS CANDLESTICK         0       0       0       0      0
##            LARGE ROUND WICKER PLATTER         0       0       0       0      0
##                  LARGE SKULL WINDMILL         0       0       0       0      0
##      LARGE STRIPES CHOCOLATE GIFT BAG         0       0       0       0      0
##                LARGE TAHITI BEACH BAG         0       0       0       0      0
##        LARGE TORTILLA DESIGN RED BOWL         0       0       0       0      0
##           LARGE WHITE HEART OF WICKER         0       0       0       0      0
##      LARGE WHITE HONEYCOMB PAPER BELL         1       0       0       0      0
##      LARGE WHITE/PINK ROSE ART FLOWER         0       0       0       0      0
##        LARGE YELLOW BABUSHKA NOTEBOOK         0       0       0       0      0
##         LARGE ZINC GLASS CANDLEHOLDER         0       0       0       0      0
##       LARGE ZINC HEART WALL ORGANISER         0       0       0       0      0
##       LASER CUT MULTI STRAND NECKLACE         0       0       0       0      0
##                LAUNDRY 15C METAL SIGN         0       0       0       0      0
##             LAUREL HEART ANTIQUE GOLD         0       0       0       0      0
##           LAUREL HEART ANTIQUE SILVER         0       0       0       0      0
##              LAUREL STAR ANTIQUE GOLD         0       0       0       0      0
##            LAUREL STAR ANTIQUE SILVER         0       0       0       0      0
##      LAVENDER INCENSE 40 CONES IN TIN         0       0       0       0      0
##               LAVENDER INCENSE IN TIN         0       0       0       0      0
##            LAVENDER SCENT CAKE CANDLE         0       0       0       1      0
##         LAVENDER SCENTED FABRIC HEART         0       0       0       0      0
##              LAVENDER TOILETTE BOTTLE         0       0       0       0      0
##     LAZER CUT NECKLACE W PASTEL BEADS         0       0       0       0      0
##                LE GRAND TRAY CHIC SET         0       0       0       1      0
##     LE JARDIN BOTANIQUE CUSHION COVER         0       0       0       0      0
##        LEAVES MAGNETIC  SHOPPING LIST         0       0       0       0      0
##                        LED TEA LIGHTS         1       0       0       0      0
##      LETS GO SHOPPING COTTON TOTE BAG         0       1       0       1      0
##             LETTER "A" BLING KEY RING         0       0       0       0      0
##             LETTER "B" BLING KEY RING         0       0       0       0      0
##             LETTER "C" BLING KEY RING         0       0       0       0      0
##             LETTER "D" BLING KEY RING         0       0       0       0      0
##             LETTER "E" BLING KEY RING         0       0       0       0      0
##             LETTER "F" BLING KEY RING         0       0       0       0      0
##             LETTER "G" BLING KEY RING         0       0       0       0      0
##             LETTER "H" BLING KEY RING         0       0       0       0      0
##             LETTER "I" BLING KEY RING         0       0       0       0      0
##             LETTER "J" BLING KEY RING         0       0       0       0      0
##             LETTER "K" BLING KEY RING         0       0       0       0      0
##             LETTER "L" BLING KEY RING         0       0       0       0      0
##             LETTER "M" BLING KEY RING         0       0       0       0      0
##             LETTER "N" BLING KEY RING         0       0       0       0      0
##             LETTER "O" BLING KEY RING         0       0       0       0      0
##             LETTER "P" BLING KEY RING         0       0       0       0      0
##             LETTER "R" BLING KEY RING         0       0       0       0      0
##             LETTER "S" BLING KEY RING         0       0       0       0      0
##             LETTER "T" BLING KEY RING         0       0       0       0      0
##             LETTER "U" BLING KEY RING         0       0       0       0      0
##             LETTER "V" BLING KEY RING         0       0       0       0      0
##             LETTER "W" BLING KEY RING         0       0       0       0      0
##             LETTER "Y" BLING KEY RING         0       0       0       0      0
##             LETTER "Z" BLING KEY RING         0       0       0       0      0
##         LETTER HOLDER HOME SWEET HOME         0       0       0       0      0
##         LETTER SHAPE PENCIL SHARPENER         0       0       0       0      0
##     LIGHT DECORATION BATTERY OPERATED         0       0       0       0      0
##        LIGHT GARLAND BUTTERFILES PINK         0       0       0       0      0
##   LIGHT PINK FLOCK GLASS CANDLEHOLDER         0       0       0       0      0
##    LIGHT TOPAZ TEAL/AQUA COL NECKLACE         0       0       0       0      0
##         LIGHTHOUSE PRINTED METAL SIGN         0       0       0       0      0
##   Lighthouse Trading zero invc incorr         0       0       0       0      0
##        LILAC DIAMANTE PEN IN GIFT BOX         0       0       0       0      0
##                LILAC FEATHERS CURTAIN         0       0       0       0      0
##       LILAC GAUZE BUTTERFLY LAMPSHADE         0       0       0       0      0
##                   LILAC VOTIVE CANDLE         0       0       0       0      0
##           LILY BROOCH AMETHYST COLOUR         0       0       0       0      0
##              LILY BROOCH OLIVE COLOUR         0       0       0       0      0
##       LILY BROOCH WHITE/SILVER COLOUR         0       0       0       0      0
##                LIPSTICK PEN BABY PINK         0       0       0       1      0
##                  LIPSTICK PEN FUSCHIA         0       0       0       0      0
##                      LIPSTICK PEN RED         0       0       0       1      0
##         LITTLE GREEN MONSTER SOFT TOY         0       0       0       0      0
##          LITTLE PINK MONSTER SOFT TOY         0       0       0       0      0
##                        LOCAL CAFE MUG         0       0       0       0      0
##       LOLITA  DESIGN  COTTON TOTE BAG         0       1       0       0      0
##                 LONDON BUS COFFEE MUG         1       0       0       1      0
##    LONG SILVER NECKLACE PASTEL FLOWER         0       0       0       0      0
##                                  lost         0       0       0       0      0
##                         lost in space         0       0       0       0      0
##                                lost??         0       0       0       0      0
##              LOVE BUILDING BLOCK WORD         0       0       0       0      0
##             LOVE GARLAND PAINTED ZINC         0       0       0       0      0
##                 LOVE HEART NAPKIN BOX         0       0       0       0      0
##              LOVE HEART POCKET WARMER         0       0       0       1      0
##                LOVE HEART SOCK HANGER         0       0       0       0      0
##                LOVE HEART TRINKET POT         0       0       0       0      0
##                 LOVE HOT WATER BOTTLE         0       0       0       0      0
##               LOVE LARGE WOOD LETTERS         0       0       0       0      0
##            LOVE POTION MASALA INCENSE         0       0       0       0      0
##         LOVE SEAT ANTIQUE WHITE METAL         0       0       0       0      0
##     LOVEBIRD HANGING DECORATION WHITE         1       0       0       0      0
##           LOVELY BONBON STICKER SHEET         0       0       0       0      0
##               LUNCH BAG  BLACK SKULL.         4       0       0       1      0
##             LUNCH BAG ALPHABET DESIGN         3       0       0       1      0
##                LUNCH BAG APPLE DESIGN         6       0       0       6      0
##                   LUNCH BAG CARS BLUE         3       1       0       4      0
##              LUNCH BAG DOILEY PATTERN         2       0       0       2      0
##           LUNCH BAG DOLLY GIRL DESIGN         5       0       0       5      1
##                LUNCH BAG PAISLEY PARK         0       0       0       0      0
##               LUNCH BAG PINK POLKADOT         4       0       0       3      0
##               LUNCH BAG RED RETROSPOT         8       0       0      12      0
##           LUNCH BAG RED VINTAGE DOILY         0       0       0       0      0
##             LUNCH BAG SPACEBOY DESIGN         8       0       0      11      1
##                LUNCH BAG SUKI  DESIGN         1       0       0       0      0
##                 LUNCH BAG SUKI DESIGN         2       0       0       4      0
##              LUNCH BAG VINTAGE DOILEY         0       0       0       0      0
##               LUNCH BAG VINTAGE DOILY         2       0       0       4      0
##         LUNCH BAG VINTAGE LEAF DESIGN         2       0       0       5      0
##                    LUNCH BAG WOODLAND         6       1       0      15      0
##               LUNCH BOX I LOVE LONDON         2       0       0       5      0
##    LUNCH BOX WITH CUTLERY FAIRY CAKES         0       0       0       0      0
##      LUNCH BOX WITH CUTLERY RETROSPOT         0       3       0      10      0
##                   LUSH GREENS RIBBONS         0       0       0       0      0
##              M/COLOUR POM-POM CURTAIN         0       0       0       0      0
##               MA CAMPAGNE CUTLERY BOX         0       0       0       0      0
##                 MADRAS NOTEBOOK LARGE         0       0       0       0      0
##                MADRAS NOTEBOOK MEDIUM         0       0       0       0      0
##          MAGAZINE RACK GEBRA ASSORTED         0       0       0       0      0
##       MAGIC DRAWING SLATE BAKE A CAKE         0       0       0       0      0
##           MAGIC DRAWING SLATE BUNNIES         0       0       0       0      0
##     MAGIC DRAWING SLATE CIRCUS PARADE         0       0       0       2      0
##          MAGIC DRAWING SLATE DINOSAUR         0       0       0       1      0
##        MAGIC DRAWING SLATE DOLLY GIRL         0       0       0       1      0
##    MAGIC DRAWING SLATE GO TO THE FAIR         0       0       0       0      0
##         MAGIC DRAWING SLATE LEAP FROG         0       0       0       0      0
##            MAGIC DRAWING SLATE PURDEY         0       0       0       0      0
##          MAGIC DRAWING SLATE SPACEBOY         0       0       0       2      0
##             MAGIC GARDEN FELT GARLAND         0       0       0       0      0
##   MAGIC SHEEP WOOL GROWING FROM PAPER         0       0       0       1      0
##             MAGIC TREE -PAPER FLOWERS         0       0       0       1      0
##    MAGNETS PACK OF 4 CHILDHOOD MEMORY         0       0       0       4      0
##     MAGNETS PACK OF 4 HOME SWEET HOME         1       0       0       0      0
##         MAGNETS PACK OF 4 RETRO PHOTO         0       0       0       3      0
##            MAGNETS PACK OF 4 SWALLOWS         0       0       0       4      0
##     MAGNETS PACK OF 4 VINTAGE COLLAGE         1       0       0       0      0
##      MAGNETS PACK OF 4 VINTAGE LABELS         1       0       0       0      0
##                               mailout         0       0       0       0      0
##    MAKE YOUR OWN FLOWERPOWER CARD KIT         0       0       0       0      0
##        MAKE YOUR OWN MONSOON CARD KIT         0       1       0       0      0
##       MAKE YOUR OWN PLAYTIME CARD KIT         0       1       0       1      0
##                    MAN FLU METAL SIGN         0       0       0       0      0
##                                Manual         0       0       0       0      0
##     MARIE ANTOIENETT TRINKET BOX GOLD         0       0       0       0      0
##     MARIE ANTOINETTE TRINKET BOX GOLD         0       0       0       0      0
##   MARIE ANTOINETTE TRINKET BOX SILVER         0       0       0       0      0
##                       Marked as 23343         0       0       0       0      0
##   MAXWELL 2 TONE BLUE 60 PAGE PHOTO A         0       0       0       0      0
##          MEASURING TAPE BABUSHKA BLUE         0       1       0       1      0
##          MEASURING TAPE BABUSHKA PINK         0       1       0       1      0
##           MEASURING TAPE BABUSHKA RED         0       0       0       0      0
##            MEDINA STAMPED METAL STOOL         0       0       0       0      0
##        MEDIUM CERAMIC TOP STORAGE JAR         3       0       0       0      0
##          MEDIUM CHINESE STYLE SCISSOR         0       0       0       0      0
##      MEDIUM MEDINA STAMPED METAL BOWL         0       0       0       0      0
##                  MEDIUM PARLOUR FRAME         0       0       0       0      0
##          MEDIUM PARLOUR PICTURE FRAME         0       0       0       0      0
##               MEDIUM PINK BUDDHA HEAD         0       0       0       0      0
##     MEDIUM WHITE/PINK ROSE ART FLOWER         0       0       0       0      0
##             MEMO BOARD COTTAGE DESIGN         5       0       0       1      0
##          MEMO BOARD RETROSPOT  DESIGN         0       1       0       2      0
##   MERCHANT CHANDLER CREDIT ERROR, STO         0       0       0       0      0
##    METAL 4 HOOK HANGER FRENCH CHATEAU         0       0       0       0      0
##                METAL BASE FOR CANDLES         0       0       0       0      0
##     METAL DECORATION NAUGHTY CHILDREN         0       0       0       0      0
##           METAL HERB GERDEN CONTAINER         0       0       0       0      0
##          METAL MERRY CHRISTMAS WREATH         0       1       0       0      0
##            METAL RABBIT LADDER EASTER         0       0       0       0      0
##        METAL SIGN CUPCAKE SINGLE HOOK         0       0       0       0      0
##            METAL SIGN DROP YOUR PANTS         0       1       0       1      0
##                 METAL SIGN EMPIRE TEA         0       0       0       0      0
##       METAL SIGN HER DINNER IS SERVED         0       0       0       1      0
##       METAL SIGN HIS DINNER IS SERVED         0       0       0       0      0
##        METAL SIGN NEIGHBOURHOOD WITCH         0       0       0       0      0
##        METAL SIGN TAKE IT OR LEAVE IT         1       1       0       3      0
##        METAL SIGN,CUPCAKE SINGLE HOOK         0       0       0       0      0
##            METAL TUBE CHIME ON BAMBOO         0       0       0       0      0
##             METALIC LEAVES BAG CHARMS         0       0       0       0      0
##                                   MIA         0       0       0       0      0
##                           michel oops         0       0       0       0      0
##   MIDNIGHT BLUE COPPER FLOWER NECKLAC         0       0       0       0      0
##   MIDNIGHT BLUE CRYSTAL DROP EARRINGS         0       0       0       0      0
##   MIDNIGHT BLUE DROP CRYSTAL NECKLACE         0       0       0       0      0
##   MIDNIGHT BLUE GLASS/SILVER BRACELET         0       0       0       0      0
##   MIDNIGHT BLUE PAIR HEART HAIR SLIDE         0       0       0       0      0
##        MIDNIGHT BLUE VINTAGE EARRINGS         0       1       0       0      0
##   MIDNIGHT GLAMOUR SCARF KNITTING KIT         0       0       0       0      0
##        MILK BOTTLE WITH GLASS STOPPER         0       0       0       0      0
##                        MILK MAIDS MUG         0       0       0       0      0
##                MILK PAN BLUE POLKADOT         0       0       0       1      0
##                MILK PAN PINK POLKADOT         0       0       0       0      0
##                MILK PAN RED RETROSPOT         0       0       0       0      0
##         MINI  ZINC GARDEN DECORATIONS         0       0       0       0      0
##    MINI CAKE STAND  HANGING STRAWBERY         0       0       0       0      0
##        MINI CAKE STAND T-LIGHT HOLDER         0       0       0       1      0
##    MINI CAKE STAND WITH HANGING CAKES         0       1       1       0      0
##               MINI FUNKY DESIGN TAPES         0       0       0       0      0
##                 MINI HIGHLIGHTER PENS         0       0       0       0      0
##               MINI JIGSAW BAKE A CAKE         1       0       0       1      0
##                   MINI JIGSAW BUNNIES         2       0       0       1      0
##             MINI JIGSAW CIRCUS PARADE         1       0       0       5      0
##                  MINI JIGSAW DINOSAUR         0       0       0       4      0
##                MINI JIGSAW DOLLY GIRL         2       1       0       4      0
##            MINI JIGSAW GO TO THE FAIR         0       0       0       0      0
##                 MINI JIGSAW LEAP FROG         1       0       0       0      0
##                    MINI JIGSAW PURDEY         3       1       0       0      0
##                  MINI JIGSAW SPACEBOY         3       1       0       6      0
##            MINI LADLE LOVE HEART PINK         0       0       0       0      0
##             MINI LADLE LOVE HEART RED         0       0       0       0      0
##        MINI LIGHTS WOODLAND MUSHROOMS         1       0       0       5      0
##                MINI PAINT SET VINTAGE         6       1       0       6      0
##        MINI PAINTED GARDEN DECORATION         0       0       0       0      0
##       MINI PLAYING CARDS BUFFALO BILL         1       0       0       0      0
##         MINI PLAYING CARDS DOLLY GIRL         0       0       0       1      0
##           MINI PLAYING CARDS FUN FAIR         0       0       0       0      0
##           MINI PLAYING CARDS GYMKHANA         1       0       0       1      0
##           MINI PLAYING CARDS SPACEBOY         1       0       0       1      0
##    MINI WOODEN HAPPY BIRTHDAY GARLAND         0       0       0       1      0
##     MINIATURE ANTIQUE ROSE HOOK IVORY         0       0       0       1      0
##      MINITURE ANTIQUE ROSE HOOK IVORY         0       0       0       0      0
##                      MINT DINER CLOCK         0       0       0       0      0
##                 MINT DINER WALL CLOCK         2       0       0       3      0
##                 MINT GREEN ROSE TOWEL         0       0       0       0      0
##                   MINT KITCHEN SCALES         0       0       0       3      0
##                        MIRROR CORNICE         0       0       0       2      0
##       MIRROR LOVE BIRD T-LIGHT HOLDER         0       0       0       0      0
##            MIRROR MOSAIC CANDLE PLATE         0       0       0       0      0
##    MIRROR MOSAIC GOBLET CANDLE HOLDER         0       0       0       0      0
##          MIRROR MOSAIC HURRICANE LAMP         0       0       0       0      0
##          MIRROR MOSAIC T-LIGHT HOLDER         0       0       0       0      0
##    MIRROR MOSAIC T-LIGHT HOLDER ROUND         0       0       0       0      0
##           MIRROR MOSAIC VOTIVE HOLDER         0       0       0       0      0
##                   MIRRORED DISCO BALL         0       0       0       1      0
##         MIRRORED DOVE WALL DECORATION         0       0       0       0      0
##                MIRRORED WALL ART FOXY         0       0       0       0      0
##               MIRRORED WALL ART GENTS         0       0       0       0      0
##              MIRRORED WALL ART LADIES         0       0       0       0      0
##        MIRRORED WALL ART PHOTO FRAMES         1       0       0       0      0
##             MIRRORED WALL ART POPPIES         0       0       0       0      0
##              MIRRORED WALL ART SKULLS         0       0       0       0      0
##          MIRRORED WALL ART SNOWFLAKES         0       0       0       0      0
##            MIRRORED WALL ART SPLODGES         0       0       0       0      0
##               MIRRORED WALL ART STARS         0       0       0       0      0
##          MIRRORED WALL ART TABLE LAMP         1       0       0       0      0
##                 MISELTOE HEART WREATH         0       0       0       0      0
##           MISELTOE HEART WREATH WHITE         0       0       0       0      0
##                               missing         0       0       0       0      0
##                               Missing         0       0       0       0      0
##                              missing?         0       0       0       0      0
##          MISTLETOE HEART WREATH CREAM         0       0       0       0      0
##          MISTLETOE HEART WREATH GREEN         0       0       0       0      0
##                         mix up with c         0       0       0       0      0
##           MIXED NUTS LIGHT GREEN BOWL         0       0       0       0      0
##                              mixed up         0       0       0       0      0
##                 MOBILE VINTAGE HEARTS         2       1       0       0      0
##            MOCK LOBSTER FRIDGE MAGNET         0       0       0       0      0
##          MODERN FLORAL STATIONERY SET         2       0       0       3      0
##    MODERN VINTAGE COTTON SHOPPING BAG         0       0       0       0      0
##             MONEY BOX BISCUITS DESIGN         0       0       0       0      0
##        MONEY BOX CONFECTIONERY DESIGN         0       1       0       0      0
##            MONEY BOX FIRST ADE DESIGN         0       0       0       0      0
##            MONEY BOX FIRST AID DESIGN         0       0       0       0      0
##         MONEY BOX HOUSEKEEPING DESIGN         0       0       0       0      0
##         MONEY BOX KINGS CHOICE DESIGN         0       0       0       0      0
##         MONEY BOX POCKET MONEY DESIGN         0       0       0       1      0
##                MONSTERS STENCIL CRAFT         0       0       0       0      0
##      MONTANA DIAMOND CLUSTER EARRINGS         0       0       0       0      0
##      MONTANA DIAMOND CLUSTER NECKLACE         0       0       0       0      0
##                MOODY BOY  DOOR HANGER         0       0       0       0      0
##                MOODY GIRL DOOR HANGER         0       0       0       0      0
##            MOP PENDANT SHELL NECKLACE         0       0       0       0      0
##                MORE BUTTER METAL SIGN         1       0       0       0      0
##            MOROCCAN BEATEN METAL DISH         0       0       0       0      0
##      MOROCCAN BEATEN METAL DISH LARGE         0       0       0       0      0
##          MOROCCAN BEATEN METAL MIRROR         0       0       0       0      0
##                    MOROCCAN TEA GLASS         0       0       0       1      0
##           MOTHER'S KITCHEN SPOON REST         0       0       0       0      0
##                   MOTORING TISSUE BOX         2       0       0       0      0
##                                mouldy         0       0       0       0      0
##                  mouldy, thrown away.         0       0       0       0      0
##                   mouldy, unsaleable.         0       0       0       0      0
##           MOUSE TOY WITH PINK T-SHIRT         0       0       0       1      0
##             MOUSEY LONG LEGS SOFT TOY         0       0       0       1      0
##                     MR ROBOT SOFT TOY         0       1       0       0      0
##                    MRS ROBOT SOFT TOY         0       0       0       0      0
##              MUG , DOTCOMGIFTSHOP.COM         0       0       0       0      0
##    MULTI COLOUR SILVER T-LIGHT HOLDER         2       0       0       2      0
##                MULTI HEARTS  STICKERS         0       0       0       0      0
##         MULTICOLOUR  CONFETTI IN TUBE         1       0       0       1      0
##          MULTICOLOUR 3D BALLS GARLAND         0       0       0       0      0
##             MULTICOLOUR EASTER RABBIT         0       0       0       0      0
##             MULTICOLOUR HONEYCOMB FAN         0       0       0       0      0
##   MULTICOLOUR HONEYCOMB PAPER GARLAND         0       0       0       0      0
##            MULTICOLOUR POLKADOT PLATE         0       0       0       0      0
##         MULTICOLOUR RABBIT EGG WARMER         0       0       0       0      0
##         MULTICOLOUR SPRING FLOWER MUG         0       0       0       0      0
##                   MUM'S KITCHEN CLOCK         0       0       0       0      0
##        MUMMY MOUSE RED GINGHAM RIBBON         0       0       0       0      0
##     MURANO STYLE GLASS BRACELET BLACK         0       0       0       0      0
##      MURANO STYLE GLASS BRACELET GOLD         0       0       0       0      0
##       MURANO STYLE GLASS BRACELET RED         0       0       0       0      0
##         MUSICAL ZINC HEART DECORATION         0       0       0       0      0
##      mystery! Only ever imported 1800         0       0       0       0      0
##                 N0 SINGING METAL SIGN         0       0       0       0      0
##                NAMASTE SWAGAT INCENSE         0       0       0       0      0
##        NATURAL HANGING QUILTED HEARTS         0       0       0       0      0
##        NATURAL SLATE CHALKBOARD LARGE         0       0       0       0      0
##        NATURAL SLATE HEART CHALKBOARD         1       0       0       2      0
##    NATURAL SLATE RECTANGLE CHALKBOARD         1       0       0       0      1
##      NECKLACE+BRACELET PINK BUTTERFLY         0       0       0       0      0
##    NECKLACE+BRACELET SET BLUE BLOSSOM         0       0       0       0      0
##   NECKLACE+BRACELET SET BLUE HIBISCUS         0       0       0       0      0
##     NECKLACE+BRACELET SET FRUIT SALAD         0       0       0       0      0
##      NECKLACE+BRACELET SET PINK DAISY         0       0       0       0      0
##    NEW BAROQUE B'FLY NECKLACE CRYSTAL         0       0       0       0      0
##      NEW BAROQUE B'FLY NECKLACE GREEN         0       0       0       0      0
##    NEW BAROQUE B'FLY NECKLACE MONTANA         0       0       0       0      0
##       NEW BAROQUE B'FLY NECKLACE PINK         0       0       0       0      0
##        NEW BAROQUE B'FLY NECKLACE RED         0       0       0       1      0
##               NEW BAROQUE BLACK BOXES         0       0       0       0      0
##         NEW BAROQUE BLACK PHOTO ALBUM         0       0       0       0      0
##             NEW BAROQUE JEWELLERY BOX         0       0       0       0      0
##   NEW BAROQUE LARGE NECKLACE BLK/WHIT         0       0       0       0      0
##      NEW BAROQUE SMALL NECKLACE BLACK         0       0       0       0      0
##            NEW ENGLAND MUG W GIFT BOX         0       0       0       0      0
##                       NEWSPAPER STAND         0       0       0       0      0
##                     Next Day Carriage         0       0       0       0      0
##               NINE DRAWER OFFICE TIDY         0       0       0       0      0
##                    NINJA RABBIT BLACK         0       0       0       0      0
##                     NINJA RABBIT PINK         0       0       0       0      0
##               NO JUNK MAIL METAL SIGN         1       0       0       0      0
##                 NO SINGING METAL SIGN         0       0       0       0      0
##             NOEL GARLAND PAINTED ZINC         1       0       0       0      0
##             NOEL WOODEN BLOCK LETTERS         0       0       0       0      0
##       Not rcvd in 10/11/2010 delivery         0       0       0       0      0
##    NOVELTY BISCUITS CAKE STAND 3 TIER         0       0       2       0      0
##          NUMBER TILE COTTAGE GARDEN 0         0       0       0       0      0
##          NUMBER TILE COTTAGE GARDEN 1         0       0       0       0      0
##          NUMBER TILE COTTAGE GARDEN 2         0       0       0       0      0
##          NUMBER TILE COTTAGE GARDEN 3         0       0       0       0      0
##          NUMBER TILE COTTAGE GARDEN 4         0       0       0       0      0
##          NUMBER TILE COTTAGE GARDEN 5         0       0       0       0      0
##          NUMBER TILE COTTAGE GARDEN 6         0       0       0       0      0
##          NUMBER TILE COTTAGE GARDEN 7         0       0       0       0      0
##          NUMBER TILE COTTAGE GARDEN 8         0       0       0       0      0
##          NUMBER TILE COTTAGE GARDEN 9         0       0       0       0      0
##         NUMBER TILE COTTAGE GARDEN No         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 0         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 1         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 2         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 3         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 4         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 5         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 6         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 7         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 8         0       0       0       0      0
##            NUMBER TILE VINTAGE FONT 9         0       0       0       0      0
##           NUMBER TILE VINTAGE FONT No         0       0       0       0      0
##                  NURSE'S BAG SOFT TOY         0       0       0       0      0
##         NURSERY A,B,C PAINTED LETTERS         0       0       0       0      0
##    OCEAN SCENT CANDLE IN JEWELLED BOX         0       0       2       0      0
##    OCEAN SCENT CANDLE JEWELLED DRAWER         0       0       0       0      0
##                  OCEAN STRIPE HAMMOCK         0       0       0       0      0
##        OFFICE MUG WARMER BLACK+SILVER         0       0       0       0      0
##           OFFICE MUG WARMER CHOC+BLUE         0       0       0       0      0
##                OFFICE MUG WARMER PINK         0       1       0       0      0
##            OFFICE MUG WARMER POLKADOT         0       1       0       0      0
##             OLD DOC RUSSEL METAL SIGN         0       0       0       0      0
##          OLD ROSE COMBO BEAD NECKLACE         0       0       0       0      0
##                        on cargo order         0       0       0       0      0
##                 OOH LA LA DOGS COLLAR         0       0       0       0      0
##                     OOPS ! adjustment         0       0       0       0      0
##                OPEN CLOSED METAL SIGN         4       1       0       3      1
##           OPIUM SCENTED VOTIVE CANDLE         0       0       0       0      0
##          OPULENT VELVET SET/3 CANDLES         0       0       0       0      0
##            ORANGE FELT VASE + FLOWERS         0       0       0       0      0
##                     ORANGE FLOWER MUG         0       0       0       0      0
##   ORANGE PENDANT TRIPLE SHELL NECKLAC         0       0       0       0      0
##         ORANGE SCENTED SET/9 T-LIGHTS         0       0       0       0      0
##                  ORANGE TV TRAY TABLE         0       0       0       0      0
##                  ORANGE VOTIVE CANDLE         0       0       0       1      0
##        ORANGE/FUSCHIA STONES NECKLACE         0       0       0       0      0
##    ORANGE/WHT/FUSCHIA STONES NECKLACE         0       0       0       0      0
##          ORGANISER WOOD ANTIQUE WHITE         0       0       0       2      0
##            ORIENTAL RED CUSHION COVER         0       0       0       0      0
##    ORIGAMI JASMINE INCENSE/CANDLE SET         0       0       0       0      0
##    ORIGAMI LAVENDER INCENSE/CANDL SET         0       0       0       0      0
##      ORIGAMI OPIUM INCENSE/CANDLE SET         0       0       0       0      0
##          ORIGAMI ROSE INCENSE IN TUBE         0       0       0       0      0
##       ORIGAMI ROSE INCENSE/CANDLE SET         0       0       0       0      0
##   ORIGAMI SANDLEWOOD INCENSE/CAND SET         0       0       0       0      0
##     ORIGAMI SANDLEWOOD INCENSE+FLOWER         0       0       0       0      0
##         ORIGAMI VANILLA INCENSE CONES         0       0       0       0      0
##    ORIGAMI VANILLA INCENSE/CANDLE SET         0       0       0       0      0
##             OVAL  MINI PORTRAIT FRAME         0       0       0       1      0
##             OVAL WALL MIRROR DIAMANTE         0       0       0       0      0
##               OVEN MITT APPLES DESIGN         0       0       0       0      0
##    OVERNIGHT BAG VINTAGE ROSE PAISLEY         0       0       0       0      0
##                          OWL DOORSTOP         0       0       0       0      0
##                    OYSTER TRINKET BOX         0       0       0       0      0
##                    PACK 20 DOLLY PEGS         0       0       0       0      0
##    PACK 20 ENGLISH ROSE PAPER NAPKINS         0       0       0       0      0
##           PACK 3 BOXES BIRD PANETTONE         0       0       0       0      0
##           PACK 3 BOXES BIRD PANNETONE         1       1       0       0      0
##      PACK 3 BOXES CHRISTMAS PANETTONE         0       0       0       0      0
##      PACK 3 BOXES CHRISTMAS PANNETONE         1       1       0       1      0
##        PACK 3 FIRE ENGINE/CAR PATCHES         0       0       0       1      0
##            PACK 3 IRON ON DOG PATCHES         0       0       0       1      0
##       PACK 4 FLOWER/BUTTERFLY PATCHES         0       0       0       0      0
##        PACK 6 HEART/ICE-CREAM PATCHES         0       0       0       0      0
##     PACK OF 12 50'S CHRISTMAS TISSUES         0       0       0       1      0
##       PACK OF 12 BLUE PAISLEY TISSUES         0       0       0       0      0
##        PACK OF 12 CHRISTMAS FUN CARDS         0       0       0       0      0
##      PACK OF 12 CIRCUS PARADE TISSUES         1       0       0       0      0
##           PACK OF 12 COLOURED PENCILS         0       0       0       2      0
##             PACK OF 12 DOILEY TISSUES         0       0       0       0      0
##         PACK OF 12 DOLLY GIRL TISSUES         0       0       0       1      0
##      PACK OF 12 HEARTS DESIGN TISSUES         0       0       0       0      0
##             PACK OF 12 LONDON TISSUES         0       0       0       0      0
##       PACK OF 12 PAISLEY PARK TISSUES         0       0       0       0      0
##       PACK OF 12 PINK PAISLEY TISSUES         1       0       0       0      0
##      PACK OF 12 PINK POLKADOT TISSUES         0       0       0       0      0
##          PACK OF 12 RED APPLE TISSUES         0       0       0       1      0
##      PACK OF 12 RED RETROSPOT TISSUES         0       0       0       1      0
##              PACK OF 12 SKULL TISSUES         0       0       0       0      0
##           PACK OF 12 SPACEBOY TISSUES         0       0       0       2      0
##             PACK OF 12 STICKY BUNNIES         0       0       0       0      0
##               PACK OF 12 SUKI TISSUES         0       0       0       0      0
##        PACK OF 12 TRADITIONAL CRAYONS         0       0       0       3      0
##   PACK OF 12 VINTAGE CHRISTMAS TISSUE         0       0       0       0      0
##      PACK OF 12 VINTAGE DOILY TISSUES         0       0       0       0      0
##       PACK OF 12 VINTAGE LEAF TISSUES         0       0       0       1      0
##           PACK OF 12 WOODLAND TISSUES         1       0       0       2      0
##      PACK OF 20 NAPKINS PANTRY DESIGN         2       0       0       4      0
##         PACK OF 20 NAPKINS RED APPLES         1       0       0       7      0
##        PACK OF 20 SKULL PAPER NAPKINS         1       1       0       3      0
##           PACK OF 20 SPACEBOY NAPKINS         2       0       0       3      0
##             PACK OF 6 BIRDY GIFT TAGS         0       0       0       0      0
##     PACK OF 6 COCKTAIL PARASOL STRAWS         1       0       0       0      0
##          PACK OF 6 HANDBAG GIFT BOXES         1       1       0       0      0
##          PACK OF 6 LARGE FRUIT STRAWS         1       0       0       0      0
##        PACK OF 6 PANETTONE GIFT BOXES         0       0       0       0      0
##        PACK OF 6 PANNETONE GIFT BOXES         1       1       0       0      0
##   PACK OF 6 SANDCASTLE FLAGS ASSORTED         1       0       0       0      0
##            PACK OF 6 SKULL PAPER CUPS         1       1       0       3      0
##          PACK OF 6 SKULL PAPER PLATES         1       1       0       3      0
##          PACK OF 6 SMALL FRUIT STRAWS         1       0       0       0      0
##          PACK OF 6 SWEETIE GIFT BOXES         0       1       0       1      0
##        PACK OF 60 DINOSAUR CAKE CASES         0       0       0      10      0
##        PACK OF 60 MUSHROOM CAKE CASES         2       0       0       8      0
##    PACK OF 60 PINK PAISLEY CAKE CASES         2       2       0       4      0
##        PACK OF 60 SPACEBOY CAKE CASES         2       0       0       9      0
##       PACK OF 72 RETROSPOT CAKE CASES         2       1       0      12      0
##           PACK OF 72 SKULL CAKE CASES         2       0       0       3      0
##            PACK OF SIX LED TEA LIGHTS         0       0       0       0      0
##            PACK/12 BLUE FOLKART CARDS         0       0       0       0      0
##                 PACK/12 XMAS FUN CARD         0       0       0       0      0
##                        PACKING CHARGE         0       0       0       0      0
##            PADS TO MATCH ALL CUSHIONS         0       0       0       0      0
##             PAINT YOUR OWN CANVAS SET         0       0       0       1      0
##          PAINT YOUR OWN EGGS IN CRATE         0       0       0       0      0
##        PAINTED HEART WREATH WITH BELL         0       0       0       0      0
##      PAINTED LIGHTBULB RAINBOW DESIGN         0       0       0       0      0
##          PAINTED LIGHTBULB STAR+ MOON         0       0       0       0      0
##   PAINTED METAL HEART WITH HOLLY BELL         0       0       0       0      0
##          PAINTED METAL PEARS ASSORTED         0       0       0       0      0
##   PAINTED METAL STAR WITH HOLLY BELLS         0       0       0       0      0
##                   PAINTED PINK RABBIT         0       0       0       0      0
##     PAINTED SEA SHELL METAL WINDCHIME         0       0       0       0      0
##           PAINTED YELLOW WOODEN DAISY         0       0       0       0      0
##             PAIR BUTTERFLY HAIR CLIPS         0       0       0       0      0
##     PAIR OF ENAMEL BUTTERFLY HAIRCLIP         0       0       0       0      0
##     PAIR OF PINK FLOWER CLUSTER SLIDE         0       0       0       0      0
##        PAIR PADDED HANGERS PINK CHECK         0       0       0       0      0
##                     PAISLEY PARK CARD         0       0       0       0      0
##             PAISLEY PATTERN  STICKERS         0       0       0       0      0
##     PALE PINK/AMETHYST STONE NECKLACE         0       0       0       0      0
##       PANDA AND BUNNIES STICKER SHEET         0       0       0       0      0
##      PANTRY 3 HOOK ROLLING PIN HANGER         0       0       0       0      0
##                    PANTRY APPLE CORER         1       0       0       1      0
##                 PANTRY CHOPPING BOARD         1       1       0       0      0
##             PANTRY HOOK BALLOON WHISK         0       0       0       0      0
##                   PANTRY HOOK SPATULA         0       0       0       0      0
##              PANTRY HOOK TEA STRAINER         0       0       0       0      0
##            PANTRY KITCHEN THERMOMETER         0       0       0       0      0
##        PANTRY MAGNETIC  SHOPPING LIST         0       1       0       1      0
##                   PANTRY PASTRY BRUSH         0       0       0       0      0
##                    PANTRY ROLLING PIN         3       0       0       0      0
##                PANTRY SCRUBBING BRUSH         3       0       0       0      0
##               PANTRY WASHING UP BRUSH         2       0       0       0      0
##           PAPER BUNTING COLOURED LACE         0       0       0       0      0
##            PAPER BUNTING PAISLEY PARK         0       0       0       0      0
##               PAPER BUNTING RETROSPOT         7       0       0       4      0
##         PAPER BUNTING VINTAGE PAISLEY         1       0       0       0      0
##           PAPER BUNTING VINTAGE PARTY         0       0       0       1      0
##              PAPER BUNTING WHITE LACE         4       0       0       0      0
##        PAPER CHAIN KIT 50'S CHRISTMAS         3       0       0       0      0
##                PAPER CHAIN KIT EMPIRE         0       0       0       0      0
##                PAPER CHAIN KIT LONDON         1       0       0       0      0
##             PAPER CHAIN KIT RETROSPOT         3       0       0       0      0
##                PAPER CHAIN KIT SKULLS         1       0       0       0      0
##     PAPER CHAIN KIT VINTAGE CHRISTMAS         4       0       0       0      0
##           PAPER CRAFT , LITTLE BIRDIE         0       0       0       0      0
##     PAPER LANTERN 5 POINT SEQUIN STAR         0       0       0       0      0
##       PAPER LANTERN 5 POINT STAR MOON         0       0       0       0      0
##    PAPER LANTERN 5 POINT STAR MOON 30         0       0       0       0      0
##    PAPER LANTERN 5 POINT STUDDED STAR         0       0       0       0      0
##       PAPER LANTERN 6 POINT SNOW STAR         0       0       0       0      0
##       PAPER LANTERN 7 POINT SNOW STAR         0       0       0       0      0
##     PAPER LANTERN 9 POINT DELUXE STAR         0       0       0       0      0
##   PAPER LANTERN 9 POINT HOLLY STAR 23         0       0       0       0      0
##   PAPER LANTERN 9 POINT HOLLY STAR 40         0       0       0       0      0
##    PAPER LANTERN 9 POINT HOLLY STAR L         0       0       0       0      0
##    PAPER LANTERN 9 POINT HOLLY STAR S         0       0       0       0      0
##       PAPER LANTERN 9 POINT SNOW STAR         1       0       0       1      0
##            PAPER POCKET TRAVELING FAN         0       0       0       0      0
##        PAPERWEIGHT CHILDHOOD MEMORIES         0       0       0       3      0
##           PAPERWEIGHT HOME SWEET HOME         0       0       0       0      0
##              PAPERWEIGHT KINGS CHOICE         0       0       0       0      0
##           PAPERWEIGHT SAVE THE PLANET         0       0       0       0      0
##           PAPERWEIGHT VINTAGE COLLAGE         0       0       0       0      0
##           PAPERWEIGHT VINTAGE PAISLEY         0       0       0       0      0
##              PARISIENNE CURIO CABINET         0       0       0       1      0
##           PARISIENNE JEWELLERY DRAWER         0       0       0       1      0
##                PARISIENNE KEY CABINET         0       0       0       1      0
##                 PARISIENNE SEWING BOX         0       0       0       1      0
##             PARLOUR CERAMIC WALL HOOK         0       0       0       0      0
##                         PARTY BUNTING         8       1       0       2      0
##                PARTY CHARMS 50 PIECES         1       1       0       0      0
##       PARTY CONE CHRISTMAS DECORATION         0       0       0       0      0
##            PARTY CONES CANDY ASSORTED         1       1       0       0      0
##          PARTY CONES CANDY DECORATION         0       0       0       0      0
##     PARTY CONES CANDY TREE DECORATION         0       0       0       0      0
##         PARTY CONES CARNIVAL ASSORTED         0       0       0       0      0
##                PARTY FOOD SHOPPER BAG         0       0       0       0      0
##            PARTY INVITES BALLOON GIRL         0       0       0       1      0
##               PARTY INVITES DINOSAURS         0       0       0       2      0
##                PARTY INVITES FOOTBALL         0       0       0       0      0
##             PARTY INVITES JAZZ HEARTS         0       0       0       1      0
##                PARTY INVITES SPACEMAN         0       0       0       1      0
##                PARTY INVITES WOODLAND         3       0       0       2      0
##                      PARTY METAL SIGN         0       2       0       1      0
##        PARTY PIZZA DISH BLUE POLKADOT         0       0       0       0      0
##       PARTY PIZZA DISH GREEN POLKADOT         0       0       0       0      0
##        PARTY PIZZA DISH PINK POLKADOT         0       0       0       0      0
##        PARTY PIZZA DISH RED RETROSPOT         0       0       0       0      0
##             PARTY TIME DESIGN FLANNEL         0       0       0       0      0
##             PARTY TIME PENCIL ERASERS         0       0       0       1      0
##               PASTEL BLUE PHOTO ALBUM         0       0       0       0      0
##           PASTEL COLOUR HONEYCOMB FAN         1       0       0       0      0
##               PASTEL PINK PHOTO ALBUM         0       0       0       0      0
##              PEACE SMALL WOOD LETTERS         0       0       0       0      0
##            PEACE WOODEN BLOCK LETTERS         1       0       0       0      0
##                     PEACH KNITTED HEN         0       0       0       0      0
##         PEARL & SHELL 42"NECKL. GREEN         0       0       0       0      0
##         PEARL & SHELL 42"NECKL. IVORY         0       0       0       0      0
##       PEARL AND CHERRY QUARTZ BRACLET         0       0       0       0      0
##    PEARL CRYSTAL PUMPKIN T-LIGHT HLDR         0       0       0       0      0
##           PEARLISED IVORY HEART LARGE         0       0       0       0      0
##           PEARLISED IVORY HEART SMALL         0       0       0       0      0
##                 PEG BAG APPLES DESIGN         0       0       0       0      0
##         PENCIL CASE LIFE IS BEAUTIFUL         0       1       0       0      0
##          PENNY FARTHING BIRTHDAY CARD         2       1       0       0      0
##           PENS ASSORTED FUNKY JEWELED         0       0       0       0      0
##              PENS ASSORTED FUNNY FACE         0       0       0       0      0
##               PENS ASSORTED SPACEBALL         0       0       0       0      0
##             PERIWINKLE T-LIGHT HOLDER         0       0       0       0      0
##                     PET MUG, GOLDFISH         0       0       0       0      0
##                       PETIT TRAY CHIC         0       0       0       0      0
##               PHARMACIE FIRST AID TIN         1       0       0       2      1
##                       PHOTO CLIP LINE         0       0       0       0      0
##                            PHOTO CUBE         0       0       0       2      0
##         PHOTO FRAME 3 CLASSIC HANGING         0       0       0       0      0
##                   PHOTO FRAME CORNICE         0       0       0       0      0
##      PHOTO FRAME LINEN AND LACE LARGE         0       0       0       0      0
##      PHOTO FRAME LINEN AND LACE SMALL         0       0       0       0      0
##        PICNIC BASKET WICKER 60 PIECES         0       0       0       0      0
##            PICNIC BASKET WICKER LARGE         0       0       0       2      0
##            PICNIC BASKET WICKER SMALL         0       0       0       0      0
##       PICNIC BOXES SET OF 3 RETROSPOT         1       0       0      10      0
##                      PICTURE DOMINOES         3       0       0       3      0
##    PICTURE FRAME WOOD TRIPLE PORTRAIT         0       0       0       0      0
##          PIECE OF CAMO STATIONERY SET         0       0       0       0      0
##        PIG KEYRING WITH LIGHT & SOUND         0       0       0       1      0
##         PIG MUG IN TWO COLOUR DESIGNS         0       0       0       1      0
##                  PIGGY BANK RETROSPOT         0       0       0       2      0
##             PIN CUSHION BABUSHKA BLUE         0       0       0       0      0
##             PIN CUSHION BABUSHKA PINK         0       0       0       0      0
##              PIN CUSHION BABUSHKA RED         0       0       0       0      0
##                  PING MICROWAVE APRON         0       0       0       0      0
##                 PING! MICROWAVE PLATE         0       0       0       0      0
##          PINK  HEART CONFETTI IN TUBE         1       0       0       1      0
##         PINK  HEART SHAPE LOVE BUCKET         0       0       0       0      0
##            PINK  HONEYCOMB PAPER BALL         2       0       0       0      0
##             PINK  HONEYCOMB PAPER FAN         1       0       0       0      0
##                    PINK  POLKADOT CUP         2       1       0       2      0
##                  PINK  POLKADOT PLATE         4       0       0       1      0
##           PINK & WHITE BREAKFAST TRAY         0       0       0       1      0
##             PINK & WHITE ROSEBUD RING         0       0       0       0      0
##     PINK 3 PIECE POLKADOT CUTLERY SET         0       0       0       0      0
##          PINK ACRYLIC JEWEL SNOWFLAKE         0       0       0       0      0
##         PINK AND BLACK STRING CURTAIN         0       0       0       0      0
##   PINK AND WHITE CHRISTMAS TREE 120CM         0       0       0       0      0
##          PINK B'FLY C/COVER W BOBBLES         0       0       0       1      0
##                     PINK BABY BUNTING         1       0       0       3      0
##      PINK BAROQUE FLOCK CANDLE HOLDER         0       0       0       0      0
##           PINK BEADS+HAND PHONE CHARM         0       0       0       0      0
##      PINK BERTIE GLASS BEAD BAG CHARM         0       0       0       0      0
##        PINK BERTIE MOBILE PHONE CHARM         0       0       0       0      0
##                PINK BITTY LIGHT CHAIN         0       0       0       0      0
##      PINK BLUE FELT CRAFT TRINKET BOX         1       0       0       1      0
##          PINK BOUDICCA LARGE BRACELET         0       0       0       0      0
##           PINK BOUDOIR T-LIGHT HOLDER         0       0       0       0      0
##         PINK BREAKFAST CUP AND SAUCER         0       0       0       0      0
##          PINK BUNNY EASTER EGG BASKET         0       0       0       0      0
##          PINK BUTTERFLY CUSHION COVER         0       0       0       0      0
##      PINK BUTTERFLY HANDBAG W BOBBLES         0       0       0       0      0
##                PINK BUTTERFLY WASHBAG         0       0       0       0      0
##     PINK CANDYSTUFT ARTIFICIAL FLOWER         0       0       0       0      0
##                         PINK CAT BOWL         0       0       0       0      0
##         PINK CAT FLORAL CUSHION COVER         0       0       0       0      0
##      PINK CHERRY BLOSSOM CUP & SAUCER         0       0       0       0      0
##                    PINK CHERRY LIGHTS         0       0       0       0      0
##       PINK CHICK EGG WARMER + EGG CUP         0       0       0       0      0
##          PINK CHRISTMAS FLOCK DROPLET         0       0       0       0      0
##        PINK CHRYSANTHEMUMS ART FLOWER         0       0       0       0      0
##         PINK CLEAR GLASS CANDLE PLATE         0       0       0       0      0
##     PINK COMBO MINI CRYSTALS NECKLACE         0       0       0       0      0
##     PINK CREAM FELT CRAFT TRINKET BOX         0       0       0       0      0
##       PINK CRYSTAL GUITAR PHONE CHARM         0       0       0       0      0
##        PINK CRYSTAL SKULL PHONE CHARM         0       0       0       0      0
##           PINK CRYSTAL+GLASS BRACELET         0       0       0       0      0
##                  PINK DAISY BAG CHARM         0       0       0       0      0
##         PINK DIAMANTE PEN IN GIFT BOX         0       0       0       0      0
##                 PINK DINER WALL CLOCK         1       0       0       0      0
##                    PINK DISCO HANDBAG         0       0       0       0      0
##                         PINK DOG BOWL         0       0       0       0      0
##                    PINK DOG CANNISTER         0       0       0       0      0
##                 PINK DOLLY HAIR CLIPS         0       0       0       0      0
##             PINK DOUGHNUT TRINKET POT         0       0       0       1      0
##    PINK DRAWER KNOB ACRYLIC EDWARDIAN         0       0       0       0      0
##               PINK EASTER HENS+FLOWER         0       0       0       0      0
##           PINK ENAMEL FLOWER HAIR TIE         0       0       0       0      0
##           PINK ENAMEL+GLASS HAIR COMB         0       0       0       0      0
##       PINK FAIRY CAKE CHILDRENS APRON         0       0       0       2      0
##         PINK FAIRY CAKE CUSHION COVER         0       0       0       0      0
##     PINK FEATHER CHRISTMAS DECORATION         0       0       0       0      0
##                 PINK FEATHERS CURTAIN         0       0       0       0      0
##           PINK FELT EASTER EGG BASKET         0       0       0       0      0
##       PINK FELT EASTER RABBIT GARLAND         0       0       0       0      0
##      PINK FELT HANGING HEART W FLOWER         0       0       0       0      0
##         PINK FLOCK GLASS CANDLEHOLDER         0       0       0       0      0
##                PINK FLOCK PHOTO FRAME         0       0       0       0      0
##        PINK FLOCK SUEDE CUSHION COVER         0       0       0       0      0
##    PINK FLORAL FELTCRAFT SHOULDER BAG         0       0       0       0      0
##        PINK FLOWER CROCHET FOOD COVER         0       0       0       0      0
##               PINK FLOWER FABRIC PONY         0       0       0       0      0
##            PINK FLOWERS RABBIT EASTER         0       0       0       0      0
##      PINK FLUFFY CHRISTMAS DECORATION         0       0       0       0      0
##                         PINK FLY SWAT         0       0       0       0      0
##       PINK FOXGLOVE ARTIIFCIAL FLOWER         0       0       0       0      0
##        PINK GAUZE BUTTERFLY LAMPSHADE         0       0       0       0      0
##           PINK GINGHAM CAT WITH SCARF         0       0       0       0      0
##               PINK GLASS CANDLEHOLDER         0       0       0       0      0
##      PINK GLASS CHUNKY CHARM BRACELET         0       0       0       0      0
##           PINK GLASS TASSLE BAG CHARM         0       0       0       0      0
##          PINK GOOSE FEATHER TREE 60CM         0       0       0       0      0
##    PINK GREEN EMBROIDERY COSMETIC BAG         0       0       0       0      0
##       PINK HANGING GINGHAM EASTER HEN         0       0       0       0      0
##     PINK HANGING HEART T-LIGHT HOLDER         0       0       0       0      0
##           PINK HAPPY BIRTHDAY BUNTING         7       1       0       2      0
##     PINK HAWAIIAN PICNIC HAMPER FOR 2         0       0       0       0      0
##      PINK HEART DOTS HOT WATER BOTTLE         0       0       0       0      0
##          PINK HEART OF GLASS BRACELET         0       0       0       0      0
##                PINK HEART RED HANDBAG         0       0       0       0      0
##       PINK HEART SHAPE EGG FRYING PAN         0       0       0       0      0
##          PINK HEART SHAPE PHOTO FRAME         0       0       0       0      0
##               PINK HEARTS LIGHT CHAIN         0       0       0       0      0
##             PINK HEARTS PAPER GARLAND         0       0       0       0      0
##                PINK HORSE SOCK PUPPET         0       1       0       0      0
##            PINK HORSE SOCK PUPPET KIT         0       0       0       0      0
##             PINK HYDRANGEA ART FLOWER         0       0       0       0      0
##     PINK JEWELLED MIRROR TRINKET TRAY         0       0       0       0      0
##             PINK JEWELLED PHOTO FRAME         0       0       0       0      0
##                 PINK KNITTED EGG COSY         0       0       0       0      0
##     PINK LEAVES AND BEADS PHONE CHARM         0       0       0       0      0
##                 PINK LOVE BIRD CANDLE         0       0       0       1      0
##             PINK LOVE HEART SHAPE CUP         0       0       0       0      0
##   PINK MARSHMALLOW SCARF KNITTING KIT         0       0       0       0      0
##              PINK METAL CHICKEN HEART         0       0       0       0      0
##             PINK METAL SWINGING BUNNY         0       0       0       0      0
##              PINK MONTE CARLO HANDBAG         0       0       0       0      0
##            PINK MURANO TWIST BRACELET         0       0       0       0      0
##            PINK MURANO TWIST NECKLACE         0       0       0       0      0
##    PINK NEW BAROQUE FLOCK CANDLESTICK         0       0       0       1      0
##    PINK NEW BAROQUECANDLESTICK CANDLE         0       0       0       0      0
##             PINK OVAL JEWELLED MIRROR         0       0       0       0      0
##           PINK OVAL SHAPE TRINKET BOX         0       0       0       0      0
##                     PINK OWL SOFT TOY         2       0       0       0      0
##                    PINK PADDED MOBILE         0       0       0       0      0
##           PINK PAINTED KASHMIRI CHAIR         0       0       0       0      0
##            PINK PAISLEY CUSHION COVER         0       0       0       0      0
##           PINK PAISLEY ROSE GIFT WRAP         1       1       0       0      0
##        PINK PAISLEY SQUARE TISSUE BOX         0       0       0       0      0
##                    PINK PAPER PARASOL         0       0       0       0      0
##                       PINK PARTY BAGS         0       1       0       0      0
##                 PINK PARTY SUNGLASSES         0       0       0       0      0
##       PINK PILLAR CANDLE SILVER FLOCK         0       0       0       0      0
##                    PINK POLKADOT BOWL         2       2       0       2      0
##      PINK POLKADOT CHILDRENS UMBRELLA         0       0       0       0      0
##          PINK POLKADOT GARDEN PARASOL         0       0       0       0      0
##                PINK POLKADOT KIDS BAG         0       0       0       0      0
##                   PINK POLKADOT PLATE         0       0       0       0      0
##                    PINK POLKADOT WRAP         0       1       0       2      0
##        PINK POODLE HANGING DECORATION         0       0       0       0      0
##                 PINK POT PLANT CANDLE         0       0       0       0      0
##        PINK REGENCY TEACUP AND SAUCER         7       0       1       1      1
##             PINK RETRO BIG FLOWER BAG         0       0       0       0      0
##                  PINK RIVIERA HANDBAG         0       0       0       0      0
##               PINK ROSE FABRIC MIRROR         0       0       0       0      0
##                     PINK ROSE WASHBAG         0       0       0       0      0
##         PINK ROSEBUD & PEARL NECKLACE         0       0       0       0      0
##           PINK ROSEBUD PEARL BRACELET         0       0       0       1      0
##           PINK ROSEBUD PEARL EARRINGS         0       0       0       0      0
##             PINK ROUND COMPACT MIRROR         0       0       0       0      0
##     PINK SCOTTIE DOG W FLOWER PATTERN         0       0       0       0      0
##           PINK SMALL GLASS CAKE STAND         0       0       0       0      0
##        PINK SMALL JEWELLED PHOTOFRAME         0       0       0       0      0
##    PINK SPOTS CHOCOLATE NESTING BOXES         0       0       0       0      0
##               PINK SQUARE TABLE CLOCK         0       0       0       0      0
##              PINK STITCHED WALL CLOCK         0       0       0       0      0
##    PINK STOCKING CHRISTMAS DECORATION         0       0       0       0      0
##               PINK STRAWBERRY HANDBAG         0       0       0       0      0
##         PINK STRING CURTAIN WITH POLE         0       0       0       0      0
##              PINK SWEETHEART BRACELET         0       0       0       0      0
##                 PINK SWEETIE NECKLACE         0       0       0       0      0
##    PINK TALL PORCELAIN T-LIGHT HOLDER         0       0       0       0      0
##          PINK UNION JACK  LUGGAGE TAG         0       0       0       0      0
##       PINK UNION JACK  PASSPORT COVER         0       0       0       0      0
##       PINK VINTAGE PAISLEY PICNIC BAG         4       0       0       0      0
##              PINK VINTAGE SPOT BEAKER         2       1       0       1      0
##       PINK VINTAGE VICTORIAN EARRINGS         0       0       0       0      0
##       PINK YELLOW PATCH CUSHION COVER         0       0       0       0      0
##           PINK/AMETHYST/GOLD NECKLACE         0       0       0       0      0
##          PINK/BLUE DISC/MIRROR STRING         0       0       0       0      0
##              PINK/BLUE STRING CURTAIN         0       0       0       0      0
##         PINK/FLOWER RABBIT EGG WARMER         0       0       0       0      0
##      PINK/GREEN FLOWER DESIGN BIG MUG         0       0       0       0      0
##            PINK/PURPLE CIRCLE CURTAIN         0       0       0       0      0
##               PINK/PURPLE RETRO RADIO         0       0       0       2      0
##    PINK/WHITE "KEEP CLEAN" BULLET BIN         0       0       0       0      0
##        PINK/WHITE CHRISTMAS TREE 30CM         0       0       0       0      0
##        PINK/WHITE CHRISTMAS TREE 60CM         0       0       0       0      0
##          PINK/WHITE GLASS DEMI CHOKER         0       0       0       0      0
##        PINK/WHITE RIBBED MELAMINE JUG         0       0       0       0      0
##           PINK/YELLOW FLOWERS HANDBAG         0       0       0       0      0
##                    PIZZA PLATE IN BOX         0       0       0       0      0
##             PLACE SETTING WHITE HEART         0       0       0       2      0
##              PLACE SETTING WHITE STAR         0       0       0       0      0
##                     PLASMATRONIC LAMP         0       0       0       0      0
##         PLASTERS IN TIN CIRCUS PARADE         2       3       0       8      0
##                PLASTERS IN TIN SKULLS         0       1       0       1      0
##              PLASTERS IN TIN SPACEBOY         2       2       0      13      0
##             PLASTERS IN TIN STRONGMAN         2       2       0       9      0
##       PLASTERS IN TIN VINTAGE PAISLEY         3       3       0       2      0
##      PLASTERS IN TIN WOODLAND ANIMALS         1       3       0      11      0
##           PLAYING CARDS I LOVE LONDON         1       0       0       0      0
##      PLAYING CARDS JUBILEE UNION JACK         0       0       0       0      0
##    PLAYING CARDS KEEP CALM & CARRY ON         0       0       0       0      0
##          PLAYING CARDS VINTAGE DOILEY         0       0       0       0      0
##           PLAYING CARDS VINTAGE DOILY         2       0       0       0      0
##          PLEASE ONE PERSON METAL SIGN         0       0       0       0      1
##      POCKET BAG BLUE PAISLEY RED SPOT         0       1       0       0      0
##    POCKET BAG PINK PAISELY BROWN SPOT         0       0       0       0      0
##             POCKET MIRROR "GLAMOROUS"         0       0       0       0      0
##                POCKET MIRROR WOODLAND         0       0       0       0      0
##           POLKA DOT RAFFIA FOOD COVER         0       0       0       0      0
##     POLKADOT COFFEE CUP & SAUCER PINK         0       0       0       0      0
##                     POLKADOT MUG PINK         0       0       0       0      0
##                          POLKADOT PEN         0       0       0       5      0
##                     POLKADOT RAIN HAT         0       0       0       0      0
##        POLYESTER FILLER PAD 30CMx30CM         0       0       0       1      0
##          POLYESTER FILLER PAD 40x40cm         0       0       0       0      0
##          POLYESTER FILLER PAD 45x30cm         0       0       0       0      0
##          POLYESTER FILLER PAD 45x45cm         0       0       0       0      0
##          POLYESTER FILLER PAD 60x40cm         0       0       0       0      0
##        POLYESTER FILLER PAD 65CMx65CM         0       0       0       0      0
##                        POMPOM CURTAIN         0       0       0       0      0
##              POP ART PUSH DOWN RUBBER         0       0       0       0      0
##     POPART RECT PENCIL SHARPENER ASST         0       0       0       0      0
##            POPART WOODEN PENCILS ASST         0       0       0       1      0
##                        POPCORN HOLDER         0       0       0       1      0
##           POPPY FIELDS CHOPPING BOARD         0       0       0       0      0
##            POPPY'S PLAYHOUSE BATHROOM         0       0       0       0      0
##             POPPY'S PLAYHOUSE BEDROOM         0       0       0       2      0
##             POPPY'S PLAYHOUSE KITCHEN         0       0       0       1      0
##          POPPY'S PLAYHOUSE LIVINGROOM         0       0       0       2      0
##        PORCELAIN BUDAH INCENSE HOLDER         0       0       0       0      0
##        PORCELAIN BUTTERFLY OIL BURNER         0       0       0       0      0
##                  PORCELAIN ROSE LARGE         1       0       0       0      0
##                  PORCELAIN ROSE SMALL         1       0       0       0      0
##    PORCELAIN T-LIGHT HOLDERS ASSORTED         0       0       0       0      0
##             POSSIBLE DAMAGES OR LOST?         0       0       0       0      0
##                               POSTAGE         1      14       0      96      0
##            POSTE FRANCE CUSHION COVER         0       0       0       0      0
##                        POSY CANDY BAG         0       0       0       0      0
##      POTTERING IN THE SHED METAL SIGN         0       0       0       0      0
##                         POTTERING MUG         1       0       0       0      0
##        POTTING SHED CANDLE CITRONELLA         0       0       0       0      0
##              POTTING SHED ROSE CANDLE         0       0       0       0      0
##           POTTING SHED SEED ENVELOPES         0       0       0       0      0
##         POTTING SHED SOW 'N' GROW SET         0       0       0       0      0
##                  POTTING SHED TEA MUG         0       0       0       0      0
##                    POTTING SHED TWINE         0       0       0       0      0
##         PRETTY HANGING QUILTED HEARTS         0       0       0       0      0
##          printing smudges/thrown away         0       0       0       0      0
##          Printing smudges/thrown away         0       0       0       0      0
##       PSYCHEDELIC METAL SIGN CALENDAR         0       0       0       0      0
##              PSYCHEDELIC TILE COASTER         0       0       0       0      0
##                 PSYCHEDELIC TILE HOOK         0       0       0       0      0
##          PSYCHEDELIC WALL THERMOMETER         0       0       0       0      0
##         PURPLE ACRYLIC FACETED BANGLE         0       0       0       0      0
##     PURPLE AMETHYST NECKLACE W TASSEL         0       0       0       0      0
##      PURPLE ANEMONE ARTIFICIAL FLOWER         0       0       0       0      0
##    PURPLE BERTIE GLASS BEAD BAG CHARM         0       0       0       0      0
##        PURPLE BOUDICCA LARGE BRACELET         0       0       0       0      0
##     PURPLE CHUNKY GLASS+BEAD NECKLACE         0       0       0       0      0
##          PURPLE CRYSTAL DROP EARRINGS         0       0       0       0      0
##   PURPLE DRAWERKNOB ACRYLIC EDWARDIAN         0       0       0       0      0
##          PURPLE DRESS JEWELLERY STAND         0       0       0       0      0
##         PURPLE ENAMEL FLOWER HAIR TIE         0       0       0       0      0
##             PURPLE ENAMEL FLOWER RING         0       0       0       0      0
##         PURPLE ENAMEL+GLASS HAIR COMB         0       0       0       0      0
##    PURPLE FINE BEAD NECKLACE W TASSEL         0       0       0       0      0
##     PURPLE FOXGLOVE ARTIIFCIAL FLOWER         0       0       0       0      0
##            PURPLE FRANGIPANI HAIRCLIP         0       0       0       0      0
##            PURPLE FRANGIPANI NECKLACE         0       0       0       0      0
##              PURPLE GEMSTONE BRACELET         0       0       0       0      0
##         PURPLE GEMSTONE NECKLACE 45CM         0       0       0       0      0
##         PURPLE GLASS TASSLE BAG CHARM         0       0       0       0      0
##       PURPLE LAS VEGAS BRACELET ROUND         0       0       0       0      0
##    PURPLE LEAVES AND BEADS PHONE CHAR         0       0       0       0      0
##                  PURPLE PAPER PARASOL         0       0       0       0      0
##            PURPLE SWEETHEART BRACELET         0       0       0       0      0
##               PURPLE VINTAGE EARRINGS         0       0       0       0      0
##     PURPLE/BLUE CERAMIC CANDLE HOLDER         0       0       0       0      0
##       PURPLE/COPPER HANGING LAMPSHADE         0       0       0       0      0
##           PURPLE/TURQ FLOWERS HANDBAG         0       0       0       0      0
##            QUEEN OF SKIES LUGGAGE TAG         0       0       0       0      0
##      QUEEN OF THE SKIES HOLIDAY PURSE         0       0       0       0      0
##     QUEEN OF THE SKIES PASSPORT COVER         0       0       0       0      0
##               QUEENS GUARD COFFEE MUG         0       0       0       1      0
##       RABBIT  DESIGN  COTTON TOTE BAG         0       0       0       0      0
##              RABBIT EASTER DECORATION         0       0       0       0      0
##                    RABBIT NIGHT LIGHT         6       0       0      10      0
##                           RAIN PONCHO         0       0       0       0      0
##                 RAIN PONCHO RETROSPOT         0       0       0       2      0
##        RAINBOW PEGS PHOTO CLIP STRING         0       0       0       0      0
##            RAINY LADIES BIRTHDAY CARD         2       0       0       0      0
##   RASPBERRY ANT COPPER FLOWER NECKLAC         0       0       0       0      0
##        RASTA IN BATH W SPLIFF ASHTRAY         0       0       0       0      0
##                     RATTLE SNAKE EGGS         0       0       0       0      0
##   rcvd be air temp fix for dotcom sit         0       0       0       0      0
##                  re dotcom quick fix.         0       0       0       0      0
##                         re-adjustment         0       0       0       0      0
##     RECIPE BOX BLUE SKETCHBOOK DESIGN         0       1       0       0      0
##       RECIPE BOX PANTRY YELLOW DESIGN         2       1       0       8      0
##                  RECIPE BOX RETROSPOT         1       0       0       4      0
##           RECIPE BOX WITH METAL HEART         0       0       0       0      0
##           RECORD FRAME 7" SINGLE SIZE         0       1       0       0      0
##             RECTANGULAR SHAPED MIRROR         0       1       0       0      0
##            RECYCLED ACAPULCO MAT BLUE         1       0       0       0      1
##           RECYCLED ACAPULCO MAT GREEN         0       1       0       0      1
##        RECYCLED ACAPULCO MAT LAVENDER         0       1       0       0      1
##            RECYCLED ACAPULCO MAT PINK         1       1       0       0      1
##             RECYCLED ACAPULCO MAT RED         1       0       0       0      1
##       RECYCLED ACAPULCO MAT TURQUOISE         1       1       0       0      1
##    RECYCLED PENCIL WITH RABBIT ERASER         0       0       0       0      0
##               RECYCLING BAG RETROSPOT         5       0       0       1      0
##          RED   ACRYLIC FACETED BANGLE         0       0       0       0      0
##                       RED  EGG  SPOON         0       1       0       0      0
##                 RED  HARMONICA IN BOX         7       0       0       6      0
##     RED 3 PIECE RETROSPOT CUTLERY SET         2       0       0       1      0
##             RED APPLES CHOPPING BOARD         0       0       0       1      0
##                      RED BABY BUNTING         4       0       0       0      0
##           RED BOUDICCA LARGE BRACELET         0       0       0       0      0
##    RED CHARLIE+LOLA PERSONAL DOORSIGN         1       0       0       0      0
##           RED COAT RACK PARIS FASHION         1       0       0       0      0
##             RED DAISY PAPER LAMPSHADE         0       0       0       0      0
##                 RED DAISY POCKET BOOK         0       0       0       0      0
##                  RED DINER WALL CLOCK         4       0       0       4      0
##              RED DRAGONFLY HELICOPTER         0       0       0       0      0
##     RED DRAWER KNOB ACRYLIC EDWARDIAN         0       0       0       0      0
##                RED ENAMEL FLOWER RING         0       0       0       0      0
##         RED ENCHANTED FOREST PLACEMAT         1       0       0       0      0
##      RED FLOCK LOVE HEART PHOTO FRAME         0       0       0       0      0
##     RED FLORAL FELTCRAFT SHOULDER BAG         0       0       0       0      0
##         RED FLOWER CROCHET FOOD COVER         0       0       0       0      0
##        RED GINGHAM ROSE JEWELLERY BOX         0       0       0       1      0
##                RED GINGHAM TEDDY BEAR         0       1       0       1      0
##            RED GLASS TASSLE BAG CHARM         0       0       0       0      0
##      RED HANGING HEART T-LIGHT HOLDER         0       0       0       1      0
##                 RED HEART LUGGAGE TAG         0       0       0       0      0
##           RED HEART SHAPE LOVE BUCKET         0       0       0       0      0
##                RED HEARTS LIGHT CHAIN         0       0       0       0      0
##                    RED KITCHEN SCALES         0       0       0       9      0
##       RED KUKUI COCONUT SEED NECKLACE         0       0       0       0      0
##              RED LOVE HEART SHAPE CUP         1       0       0       0      0
##                 RED METAL BEACH SPADE         0       0       0       2      0
##              RED METAL BOX TOP SECRET         0       0       0       2      0
##                     RED PAPER PARASOL         0       0       0       0      0
##               RED PEONY CUSHION COVER         0       0       0       0      0
##                 RED PEONY TABLE CLOCK         0       0       0       0      0
##                   RED POLKADOT BEAKER         0       0       0       1      0
##              RED POLKADOT COFFEE  MUG         0       0       0       0      0
##             RED POLKADOT PUDDING BOWL         0       0       0       0      0
##                     RED PUDDING SPOON         0       0       0       0      0
##             RED PURSE WITH PINK HEART         0       0       0       0      0
##                   RED REFECTORY CLOCK         1       0       0       0      0
##          RED RETRO KITCHEN WALL CLOCK         0       0       0       0      0
##                   RED RETROSPOT APRON         0       0       0       1      0
##                RED RETROSPOT BIG BOWL         0       0       0       3      0
##                    RED RETROSPOT BOWL         2       3       0       5      0
##             RED RETROSPOT BUTTER DISH         2       0       0       0      0
##              RED RETROSPOT CAKE STAND         4       0       0       7      0
##           RED RETROSPOT CHARLOTTE BAG         0       1       0      14      0
##      RED RETROSPOT CHILDRENS UMBRELLA         0       1       0       2      0
##                     RED RETROSPOT CUP         2       1       0       5      0
##             RED RETROSPOT LUGGAGE TAG         0       0       0       0      0
##              RED RETROSPOT MINI CASES         2       1       0       7      0
##                     RED RETROSPOT MUG         0       0       0       1      0
##              RED RETROSPOT OVEN GLOVE         0       0       0       0      0
##       RED RETROSPOT OVEN GLOVE DOUBLE         0       0       0       0      0
##                 RED RETROSPOT PEG BAG         0       1       0       0      0
##              RED RETROSPOT PICNIC BAG         5       0       0       4      0
##                   RED RETROSPOT PLATE         3       2       0       5      0
##            RED RETROSPOT PUDDING BOWL         1       0       0       2      0
##                   RED RETROSPOT PURSE         1       0       0       5      0
##         RED RETROSPOT ROUND CAKE TINS         2       0       0       7      0
##             RED RETROSPOT SHOPPER BAG         0       3       0       2      0
##            RED RETROSPOT SHOPPING BAG         0       0       0       1      0
##          RED RETROSPOT SMALL MILK JUG         0       0       0       3      0
##             RED RETROSPOT STORAGE JAR         0       0       0       1      0
##          RED RETROSPOT SUGAR JAM BOWL         1       0       0       2      0
##                    RED RETROSPOT TAPE         1       0       0       4      0
##      RED RETROSPOT TEA CUP AND SAUCER         0       0       0       0      0
##              RED RETROSPOT TISSUE BOX         0       0       0       0      0
##      RED RETROSPOT TRADITIONAL TEAPOT         0       0       0       1      0
##                RED RETROSPOT UMBRELLA         4       0       0       2      0
##                 RED RETROSPOT WASHBAG         0       0       0       0      0
##                    RED RETROSPOT WRAP         0       1       0       1      0
##        RED ROCKING HORSE HAND PAINTED         0       0       0       0      0
##             RED ROSE AND LACE C/COVER         0       0       0       0      0
##                  RED SHARK HELICOPTER         0       0       0       0      0
##          RED SPOT CERAMIC DRAWER KNOB         0       1       0       1      0
##               RED SPOT GIFT BAG LARGE         0       0       0       0      0
##               RED SPOT PAPER GIFT BAG         0       0       0       0      0
##                RED SPOTTY BISCUIT TIN         2       0       0       7      0
##                  RED STAR CARD HOLDER         0       0       0       0      0
##            RED STONE/CRYSTAL EARRINGS         0       0       0       0      0
##        RED STRIPE CERAMIC DRAWER KNOB         0       1       0       0      0
##          RED TEA TOWEL CLASSIC DESIGN         0       0       0       0      0
##         RED TOADSTOOL LED NIGHT LIGHT         9       0       0      10      0
##         RED VICTORIAN FABRIC OVAL BOX         0       0       0       0      0
##               RED VINTAGE SPOT BEAKER         2       1       0       1      0
##     RED WHITE SCARF  HOT WATER BOTTLE         0       0       0       0      0
##        RED WOOLLY HOTTIE WHITE HEART.         0       0       0       0      0
##        RED/CREAM STRIPE CUSHION COVER         0       0       0       0      0
##                     REGENCY CAKE FORK         0       0       0       0      0
##                    REGENCY CAKE SLICE         0       0       0       0      0
##              REGENCY CAKESTAND 3 TIER         6       2       1      15      1
##                 REGENCY MILK JUG PINK         3       0       0       3      0
##          REGENCY MIRROR WITH SHUTTERS         0       0       0       0      0
##              REGENCY SUGAR BOWL GREEN         4       0       0       3      0
##                   REGENCY SUGAR TONGS         0       0       0       0      0
##               REGENCY TEA PLATE GREEN         2       0       0       0      0
##                REGENCY TEA PLATE PINK         2       0       0       0      0
##               REGENCY TEA PLATE ROSES         3       0       0       5      0
##                     REGENCY TEA SPOON         0       0       0       0      0
##                  REGENCY TEA STRAINER         0       0       0       0      0
##                  REGENCY TEAPOT ROSES         2       1       0       4      0
##        REINDEER HEART DECORATION GOLD         0       0       0       1      0
##      REINDEER HEART DECORATION SILVER         0       0       0       2      0
##              RELAX LARGE WOOD LETTERS         0       0       0       0      0
##         RESIN BRACELET W PASTEL BEADS         0       0       0       0      0
##         RESIN NECKLACE W PASTEL BEADS         0       0       0       0      0
##    RETO LEAVES MAGNETIC SHOPPING LIST         0       0       0       0      0
##                   RETRO "TEA FOR ONE"         0       0       0       0      0
##              RETRO BROWN BALL ASHTRAY         0       0       0       0      0
##            RETRO COFFEE MUGS ASSORTED         1       0       0       0      0
##         RETRO LEAVES MAGNETIC NOTEPAD         0       0       0       0      0
##   RETRO LONGBOARD IRONING BOARD COVER         0       0       0       0      0
##                        RETRO MOD TRAY         0       0       0       1      0
##        RETRO PILL BOX , REVOLUTIONARY         0       0       0       0      0
##     RETRO PILL BOX KEY CHAIN,THE KING         0       0       0       0      0
##               RETRO PINK BALL ASHTRAY         0       0       0       0      0
##               RETRO PLASTIC 70'S TRAY         0       0       0       4      0
##              RETRO PLASTIC DAISY TRAY         0       0       0       1      0
##           RETRO PLASTIC ELEPHANT TRAY         2       0       0       4      0
##              RETRO PLASTIC POLKA TRAY         0       0       0       7      0
##       RETRO TIN ASHTRAY,REVOLUTIONARY         0       0       0       0      0
##           RETROSPOT BABUSHKA DOORSTOP         0       0       0       0      0
##               RETROSPOT CANDLE  LARGE         0       0       0       0      0
##              RETROSPOT CANDLE  MEDIUM         0       0       0       1      0
##               RETROSPOT CANDLE  SMALL         0       0       0       0      0
##             RETROSPOT CHILDRENS APRON         0       1       0       4      0
##           RETROSPOT CIGAR BOX MATCHES         0       0       0       0      0
##          RETROSPOT GIANT TUBE MATCHES         0       0       0       0      0
##      RETROSPOT HEART HOT WATER BOTTLE         0       1       0       1      0
##                        RETROSPOT LAMP         0       0       0       3      0
##              RETROSPOT LARGE MILK JUG         0       0       0       3      0
##         RETROSPOT PADDED SEAT CUSHION         1       0       0       1      0
##     RETROSPOT PARTY BAG + STICKER SET         4       0       0       3      0
##       RETROSPOT RED WASHING UP GLOVES         0       0       0       0      0
##          RETROSPOT SMALL TUBE MATCHES         0       0       0       0      0
##       RETROSPOT TEA SET CERAMIC 11 PC         5       4       0       4      0
##     RETROSPOT WOODEN HEART DECORATION         0       1       0       1      0
##                              returned         0       0       0       0      0
##            reverse 21/5/10 adjustment         0       0       0       0      0
##           reverse previous adjustment         0       0       0       0      0
##                 REVOLVER WOODEN RULER         3       0       0       2      0
##          REX CASH+CARRY JUMBO SHOPPER         0       0       0       0      0
##         RIBBON REEL CHRISTMAS PRESENT         1       0       0       0      0
##     RIBBON REEL CHRISTMAS SOCK BAUBLE         2       1       0       0      0
##             RIBBON REEL FLORA + FAUNA         0       0       0       0      0
##             RIBBON REEL HEARTS DESIGN         1       1       0       0      0
##               RIBBON REEL LACE DESIGN         1       0       0       0      0
##            RIBBON REEL MAKING SNOWMEN         2       0       0       0      0
##                 RIBBON REEL POLKADOTS         1       0       0       1      0
##             RIBBON REEL SNOWY VILLAGE         1       0       0       0      0
##         RIBBON REEL SOCKS AND MITTENS         1       1       0       0      0
##            RIBBON REEL STRIPES DESIGN         0       0       0       1      0
##                         RIBBONS PURSE         0       0       0       0      0
##   RIDGED BONNE JAM JAR T-LIGHT HOLDER         0       0       0       0      0
##              RIDGED GLASS FINGER BOWL         0       0       0       0      0
##                RIDGED GLASS POSY VASE         0       0       0       0      0
##    RIDGED GLASS STORAGE JAR CREAM LID         0       0       0       0      0
##           RIDGED GLASS T-LIGHT HOLDER         0       0       0       0      0
##           RING OF ROSES BIRTHDAY CARD         1       0       0       0      0
##                      RIVIERA NECKLACE         0       0       0       0      0
##                  ROBIN CHRISTMAS CARD         0       0       0       0      0
##                   ROBOT BIRTHDAY CARD         1       0       0       1      0
##              ROBOT MUG IN DISPLAY BOX         0       0       0       0      0
##         ROCKING HORSE GREEN CHRISTMAS         0       1       0       0      0
##           ROCKING HORSE RED CHRISTMAS         0       1       0       0      0
##                     ROCOCO WALL MIROR         0       0       0       0      0
##              ROCOCO WALL MIRROR WHITE         0       0       0       1      0
##              ROLL WRAP 50'S CHRISTMAS         0       0       0       1      0
##          ROLL WRAP 50'S RED CHRISTMAS         0       0       0       1      0
##           ROLL WRAP VINTAGE CHRISTMAS         1       0       0       0      0
##                ROLL WRAP VINTAGE SPOT         0       0       0       1      0
##         ROMANTIC IMAGES GIFT WRAP SET         0       0       0       0      0
##          ROMANTIC IMAGES NOTEBOOK SET         0       0       0       0      0
##        ROMANTIC IMAGES SCRAP BOOK SET         0       0       0       0      0
##                ROMANTIC PINKS RIBBONS         0       1       0       0      0
##       ROSE 1 WICK MORRIS BOXED CANDLE         0       0       0       0      0
##         ROSE 3 WICK MORRIS BOX CANDLE         0       0       0       0      0
##                 ROSE CARAVAN DOORSTOP         3       1       0       0      0
##    ROSE COLOUR PAIR HEART HAIR SLIDES         0       0       0       0      0
##             ROSE COTTAGE KEEPSAKE BOX         2       0       0       2      0
##             ROSE DU SUD COSMETICS BAG         0       0       0       1      0
##             ROSE DU SUD CUSHION COVER         0       0       0       0      0
##            ROSE DU SUD DRAWSTRING BAG         0       0       0       0      0
##                ROSE DU SUD OVEN GLOVE         0       0       0       0      0
##                   ROSE DU SUD WASHBAG         0       0       0       1      0
##    ROSE FLOWER CANDLE+INCENSE 16X16CM         0       0       0       0      0
##        ROSE FOLKART HEART DECORATIONS         0       0       0       0      0
##    ROSE PENDANT TRIPLE SHELL NECKLACE         0       0       0       0      0
##     ROSE SCENT CANDLE IN JEWELLED BOX         0       0       1       0      0
##     ROSE SCENT CANDLE JEWELLED DRAWER         0       0       0       0      0
##       ROSES REGENCY TEACUP AND SAUCER         8       1       1       4      1
##        ROTATING LEAVES T-LIGHT HOLDER         0       0       0       2      0
##   ROTATING SILVER ANGELS T-LIGHT HLDR         0       0       0       0      0
##   ROUND ARTICULATED PINK CLOCK W/SUCK         0       0       0       0      0
##          ROUND BLUE CLOCK WITH SUCKER         0       0       0       0      0
##                   ROUND CACTUS CANDLE         0       0       0       0      0
##          ROUND CAKE TIN VINTAGE GREEN         2       0       0       0      0
##            ROUND CAKE TIN VINTAGE RED         2       0       0       1      0
##    ROUND CONTAINER SET OF 5 RETROSPOT         1       0       0      10      0
##               ROUND PINK HEART MIRROR         0       0       0       0      0
##        ROUND PURPLE CLOCK WITH SUCKER         0       0       0       0      0
##     ROUND SNACK BOXES SET OF 4 FRUITS         0       4       0      22      0
##     ROUND SNACK BOXES SET OF 4 SKULLS         1       0       0       0      0
##    ROUND SNACK BOXES SET OF4 WOODLAND         4       4       0      38      0
##        ROUND STORAGE TIN VINTAGE LEAF         3       0       0       3      0
##          ROUND WHITE CONFETTI IN TUBE         1       0       0       0      0
##         RUBY DROP CHANDELIER EARRINGS         0       0       0       0      0
##           RUBY GLASS CLUSTER BRACELET         0       0       0       0      0
##           RUBY GLASS CLUSTER EARRINGS         0       0       0       0      0
##           RUBY GLASS CLUSTER NECKLACE         0       0       0       0      0
##               RUBY GLASS NECKLACE 42"         0       0       0       0      0
##    RUSTIC  SEVENTEEN DRAWER SIDEBOARD         0       0       0       0      0
##         RUSTIC MIRROR WITH LACE HEART         0       0       0       0      0
##       RUSTIC STRAWBERRY JAM POT LARGE         1       0       0       0      0
##       RUSTIC STRAWBERRY JAM POT SMALL         1       0       0       0      0
##        RUSTIC STRAWBERRY JAMPOT LARGE         0       0       0       0      0
##        RUSTIC STRAWBERRY JAMPOT SMALL         0       0       0       0      0
##    RUSTIC WOODEN CABINET, GLASS DOORS         0       0       0       0      0
##                      rusty throw away         0       0       0       0      0
##                     rusty thrown away         0       0       0       0      0
##               S/12 MINI RABBIT EASTER         0       0       0       0      0
##      S/12 VANILLA  BOTANICAL T-LIGHTS         0       0       0       0      0
##      S/15 SILVER GLASS BAUBLES IN BAG         0       0       0       0      0
##         S/2 BEACH HUT TREASURE CHESTS         0       0       0       0      0
##        S/2 ZINC HEART DESIGN PLANTERS         0       0       0       0      0
##        S/3 PINK SQUARE PLANTERS ROSES         0       0       0       0      0
##   S/3 POT POURI CUSHIONS BLUE COLOURS         0       0       0       0      0
##       S/4 BLACK DISCO PARTITION PANEL         0       0       0       0      0
##    S/4 BLACK MINI ROSE CANDLE IN BOWL         0       0       0       0      0
##                     S/4 CACTI CANDLES         0       1       0       0      0
##                S/4 GROOVY CAT MAGNETS         0       0       0       0      0
##          S/4 ICON COASTER,ELVIS LIVES         0       0       0       0      0
##    S/4 IVORY MINI ROSE CANDLE IN BOWL         0       0       0       0      0
##       S/4 PINK FLOWER CANDLES IN BOWL         0       0       1       1      0
##     S/4 VALENTINE DECOUPAGE HEART BOX         0       0       0       2      0
##            S/6 SEW ON CROCHET FLOWERS         0       0       0       0      0
##     S/6 WOODEN SKITTLES IN COTTON BAG         0       0       0       0      0
##                            Sale error         0       0       0       0      0
##                    SALLE DE BAIN HOOK         0       0       0       0      0
##                               samples         0       0       0       0      0
##                               SAMPLES         0       0       0       0      0
##                       samples/damages         0       0       0       0      0
##                        SANDALWOOD FAN         0       0       0       1      0
##                  SANDWICH BATH SPONGE         0       0       0       0      0
##       SAVE THE PLANET COTTON TOTE BAG         1       1       0       1      0
##                   SAVE THE PLANET MUG         0       0       0       0      0
##                  SAVOY ART DECO CLOCK         0       0       0       0      0
##               SCALLOP SHELL SOAP DISH         0       0       0       0      0
##     SCANDINAVIAN 3 HEARTS NAPKIN RING         0       0       0       0      0
##       SCANDINAVIAN PAISLEY PICNIC BAG         2       0       0       0      0
##             SCANDINAVIAN REDS RIBBONS         0       1       0       1      0
##       SCENTED CANDLE IN DIGITALIS TIN         0       0       0       0      0
##          SCENTED VELVET LOUNGE CANDLE         0       0       0       0      0
##                 SCHOOL DESK AND CHAIR         0       0       0       0      0
##          SCOTTIE DOG HOT WATER BOTTLE         0       0       0       0      0
##                 SCOTTIE DOGS BABY BIB         0       0       0       1      0
##              SCOTTIES CHILDRENS APRON         0       0       0       0      0
##               SCOTTIES DESIGN WASHBAG         0       0       0       0      0
##                   SEASIDE FLYING DISC         0       0       0       0      0
##    SET 10 CARD CHRISTMAS STAMPS 16963         0       0       0       0      0
##   SET 10 CARD CHRISTMAS WELCOME 17112         0       0       0       0      0
##      SET 10 CARD KRAFT REINDEER 17084         0       0       0       0      0
##    SET 10 CARD PERFECT NATIVITY 17089         0       0       0       0      0
##             SET 10 CARD SNOWMAN 16965         0       0       0       0      0
##    SET 10 CARDS 12 DAYS OF XMAS 17059         0       0       0       0      0
##      SET 10 CARDS 12 DAYS WRAP  17058         0       0       0       0      0
##         SET 10 CARDS 3 WISE MEN 17107         0       0       0       0      0
##     SET 10 CARDS CHEERFUL ROBIN 17065         0       0       0       0      0
##   SET 10 CARDS CHRISTMAS BAUBLE 16954         0       0       0       0      0
##   SET 10 CARDS CHRISTMAS HOLLY  17259         0       0       0       0      0
##    SET 10 CARDS CHRISTMAS ROBIN 17095         0       0       0       0      0
##     SET 10 CARDS CHRISTMAS TREE 16955         0       0       0       0      0
##    SET 10 CARDS DAVID'S MADONNA 17074         0       0       0       0      0
##     SET 10 CARDS DECK THE HALLS 16960         0       0       0       0      0
##         SET 10 CARDS DINKY TREE 17076         0       0       0       0      0
##        SET 10 CARDS DRESSING UP 17077         0       0       0       0      0
##    SET 10 CARDS FILIGREE BAUBLE 16961         0       0       0       0      0
##    SET 10 CARDS HANGING BAUBLES 17080         0       0       0       0      0
##   SET 10 CARDS HATS & STOCKINGS 17081         0       0       0       0      0
##       SET 10 CARDS JINGLE BELLS 16957         0       0       0       0      0
##       SET 10 CARDS JINGLE BELLS 17217         0       0       0       0      0
##       SET 10 CARDS MAGICAL TREE 17086         0       0       0       0      0
##       SET 10 CARDS OUT OF ORDER 17216         0       0       0       0      0
##       SET 10 CARDS PERFECT POST 17090         0       0       0       0      0
##         SET 10 CARDS POINSETTIA 17093         0       0       0       0      0
##    SET 10 CARDS PRINTED GRAPHIC 17219         0       0       0       0      0
##    SET 10 CARDS RED RIDING HOOD 17214         0       0       0       0      0
##   SET 10 CARDS ROBIN WATERPUMP  17096         0       0       0       0      0
##      SET 10 CARDS RUDOLPHS NOSE 17097         0       0       0       0      0
##        SET 10 CARDS SCOTTIE DOG 17211         0       0       0       0      0
##        SET 10 CARDS SNOWY ROBIN 17099         0       0       0       0      0
##   SET 10 CARDS SNOWY SNOWDROPS  17100         0       0       0       0      0
##   SET 10 CARDS SWIRLY XMAS TREE 17104         0       0       0       0      0
##    SET 10 CARDS TRIANGLE ICONS  17220         0       0       0       0      0
##       SET 10 CARDS WISHING TREE 17116         0       0       0       0      0
##     SET 10 CARDS WORLD CHILDREN 17067         0       0       0       0      0
##         SET 10 CARDS XMAS CHOIR 17068         0       0       0       0      0
##      SET 10 CARDS XMAS GRAPHIC  17218         0       0       0       0      0
##   SET 10 CHRISTMAS CARDS HOHOHO 16956         0       0       0       0      0
##               SET 10 LIGHTS NIGHT OWL         0       0       0       0      0
##    SET 10 MINI SANTA & SNOWMAN  17087         0       0       0       0      0
##   SET 10 MINICARDS CUTE SNOWMAN 17071         0       0       0       0      0
##               SET 10 NIGHT OWL LIGHTS         0       0       0       0      0
##      SET 10 XMAS CARDS & BADGES 17070         0       0       0       0      0
##          SET 12 COLOUR PENCILS DOILEY         0       0       0       0      0
##      SET 12 COLOUR PENCILS DOLLY GIRL         0       0       0       1      0
##     SET 12 COLOUR PENCILS LOVE LONDON         0       0       0       0      0
##        SET 12 COLOUR PENCILS SPACEBOY         0       0       0       1      0
##       SET 12 COLOURING PENCILS DOILEY         0       0       0       0      0
##        SET 12 COLOURING PENCILS DOILY         0       0       0       1      0
##       SET 12 KIDS  WHITE CHALK STICKS         2       0       0       0      0
##      SET 12 KIDS COLOUR  CHALK STICKS         2       1       0       3      0
##   SET 12 LAVENDER  BOTANICAL T-LIGHTS         0       0       0       0      0
##       SET 12 RETRO WHITE CHALK STICKS         0       0       0       0      0
##            SET 12 VINTAGE DOILY CHALK         0       0       0       0      0
##        SET 2 PANTRY DESIGN TEA TOWELS         1       0       0       0      0
##        SET 2 TEA TOWELS I LOVE LONDON         0       0       0       1      0
##     SET 20 NAPKINS FAIRY CAKES DESIGN         0       0       0       2      0
##   SET 3 PAPER VINTAGE CHICK PAPER EGG         2       0       0       3      0
##      SET 3 RETROSPOT TEA,COFFEE,SUGAR         2       0       0       3      0
##   SET 3 SONG BIRD PAPER EGGS ASSORTED         2       0       0       1      0
##      SET 3 WICKER OVAL BASKETS W LIDS         0       0       0       0      0
##          SET 3 WICKER STORAGE BASKETS         0       0       0       0      0
##          SET 36 COLOUR PENCILS DOILEY         0       0       0       0      0
##      SET 36 COLOUR PENCILS DOLLY GIRL         1       1       0       2      0
##     SET 36 COLOUR PENCILS LOVE LONDON         0       0       0       2      0
##        SET 36 COLOUR PENCILS SPACEBOY         1       1       0       2      0
##       SET 36 COLOURING PENCILS DOILEY         0       0       0       0      0
##        SET 36 COLOURING PENCILS DOILY         1       0       0       0      0
##         SET 4 NURSERY DES ROUND BOXES         0       0       0       0      0
##        SET 4 PICNIC CUTLERY BLUEBERRY         0       0       0       1      0
##           SET 4 PICNIC CUTLERY CHERRY         0       0       0       1      0
##          SET 4 PICNIC CUTLERY FONDANT         0       0       0       1      0
##   SET 4 VALENTINE DECOUPAGE HEART BOX         0       0       0       0      0
##   SET 40 HEART SHAPE PETIT FOUR CASES         3       1       0       1      0
##    SET 6 CARDS SPARKLY REINDEER 17262         0       0       0       0      0
##    SET 6 FOOTBALL CELEBRATION CANDLES         0       0       0       1      0
##      SET 6 PAPER TABLE LANTERN HEARTS         0       0       0       1      0
##       SET 6 PAPER TABLE LANTERN STARS         1       0       0       0      0
##    SET 6 SCHOOL MILK BOTTLES IN CRATE         3       0       0       0      0
##          SET 7 BABUSHKA NESTING BOXES         0       1       0       1      0
##          SET 8 CANDLES VINTAGE DOILEY         0       0       0       0      0
##           SET 8 CANDLES VINTAGE DOILY         1       0       0       0      0
##   SET OF 10 LANTERNS FAIRY LIGHT STAR         0       0       0       0      0
##            SET OF 10 LED DOLLY LIGHTS         5       0       0       7      0
##       SET OF 12  VINTAGE POSTCARD SET         0       0       0       1      0
##     SET OF 12 FAIRY CAKE BAKING CASES         4       1       0       2      0
##                SET OF 12 FORK CANDLES         1       0       0       0      0
##    SET OF 12 MINI BUNNIES IN A BUCKET         0       0       0       0      0
##      SET OF 12 MINI LOAF BAKING CASES         4       0       0       1      0
##     SET OF 12 ROSE BOTANICAL T-LIGHTS         0       0       0       0      0
##     SET OF 12 T-LIGHTS VINTAGE DOILEY         0       0       0       0      0
##      SET OF 12 T-LIGHTS VINTAGE DOILY         0       0       0       0      0
##       SET OF 16 VINTAGE BLACK CUTLERY         0       0       0       0      0
##       SET OF 16 VINTAGE IVORY CUTLERY         0       0       0       0      0
##   SET OF 16 VINTAGE PISTACHIO CUTLERY         0       0       0       0      0
##         SET OF 16 VINTAGE RED CUTLERY         0       0       0       0      0
##        SET OF 16 VINTAGE ROSE CUTLERY         0       0       0       0      0
##    SET OF 16 VINTAGE SKY BLUE CUTLERY         0       0       0       0      0
##   SET OF 2 CERAMIC CHRISTMAS REINDEER         1       0       0       0      0
##      SET OF 2 CERAMIC CHRISTMAS TREES         0       0       0       0      0
##       SET OF 2 CERAMIC PAINTED HEARTS         0       0       0       0      0
##   SET OF 2 CHRISTMAS DECOUPAGE CANDLE         0       1       0       0      0
##         SET OF 2 ROUND TINS CAMEMBERT         3       0       0       0      0
##  France Germany Greece Hong Kong Iceland Israel Italy Japan Lebanon Lithuania
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      12      11      0         2       0      0     0     0       0         0
##       6       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     1     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       7      10      0         0       0      0     0     0       0         0
##       7       6      0         0       0      0     0     0       0         0
##       7       4      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       9       4      1         0       0      0     1     1       0         0
##       0       2      1         1       0      0     1     0       0         0
##       6       9      0         1       0      0     1     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     1     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       4      0         0       0      1     1     2       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1      15      0         0       0      1     0     2       0         0
##       0       6      0         0       0      1     0     0       0         0
##      14      19      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       1       5      0         0       0      0     1     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     1     0       0         0
##       0       1      0         0       0      1     0     0       0         0
##       3       3      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       3      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       5      0         0       0      0     1     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      18      11      0         1       0      0     0     1       0         0
##       4       3      0         1       0      0     0     0       0         0
##       9      12      0         1       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       0      0         0       5      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       1      0     0     0       0         0
##       1       0      0         0       1      0     0     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       1      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      28      11      0         3       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       5      0         0       0      0     0     1       0         0
##       3      17      0         0       0      1     1     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       5      0         0       0      0     0     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       7       9      0         0       0      0     0     0       0         0
##      10      10      0         0       0      0     1     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       2       4      0         0       0      0     0     0       0         0
##       7      47      0         0       0      1     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       9       7      0         1       0      1     0     1       0         0
##       2       6      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8       8      0         1       3      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       3      0         0       3      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       7       2      0         0       0      0     4     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     3     0       0         0
##       3      10      0         2       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       2       4      0         0       6      0     0     0       0         0
##       6       2      0         0       3      0     0     0       0         0
##       2       1      0         0       3      0     0     0       0         0
##       3       2      0         0       4      0     0     0       0         0
##       3       1      0         0       2      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      11      12      0         0       4      0     0     0       0         0
##      38      16      0         0       3      0     0     0       0         0
##      12      13      1         0       0      0     0     0       0         0
##      17       9      0         0       2      0     0     0       0         0
##      40      32      0         0       3      1     0     0       0         0
##      37      21      1         0       5      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       4       4      0         3       0      0     0     0       0         0
##       0       7      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       3      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       5      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      17      11      0         0       0      0     1     0       0         0
##       0       2      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      27      15      0         4       0      1     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       9      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       3       5      0         0       0      0     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         2       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       1       2      1         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       4       2      0         0       0      1     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       7       3      0         0       0      0     1     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       6      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##      32      21      1         3       0      1     4     0       0         0
##      14       9      1         1       0      1     2     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       5       4      0         0       0      0     0     0       0         0
##       4       2      0         0       0      0     0     0       0         0
##       5       3      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     1       0         0
##       6       4      0         1       0      0     0     4       0         0
##       1       1      0         0       0      1     2     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         2       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       6      0         0       0      0     1     0       1         0
##       0       4      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      11      15      2         1       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       4       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       5       4      0         0       0      1     0     0       0         0
##       3       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       7       7      0         1       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       6      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1      15      0         0       0      0     1     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       1      1         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       2      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       1      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       9      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       6       5      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      13       9      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      1     0     0       0         0
##       0       4      0         0       0      1     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         1       0      0     0     0       0         0
##       4       2      0         1       1      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       5      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       4      0         0       0      2     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       3      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         1
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2      14      0         0       0      0     1     0       0         0
##      20      22      0         0       0      0     0     0       0         1
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       1      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1      15      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       4       5      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       6      15      0         4       0      1     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##      13      22      0         2       0      1     0     0       0         0
##       0       1      0         0       0      1     0     0       0         0
##       2       1      0         0       0      2     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       7      13      0         1       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       7      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       4       3      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       4       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0      13      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2      13      1         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8      14      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       3       0      0         0       2      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       4      0         0       0      1     1     0       0         0
##       0       1      0         0       0      0     1     0       0         0
##       8       8      0         0       0      0     0     0       0         0
##       0       0      0         0       2      0     0     0       0         0
##       6       2      0         0       0      0     0     0       0         0
##      11      12      0         0       0      0     1     0       0         0
##      10       5      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       2      0         2       0      1     1     0       0         0
##       1       0      1         0       0      0     1     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       4      0         0       0      1     0     0       0         0
##       4      10      1         0       0      0     6     0       0         0
##       0       9      0         0       0      0     1     0       0         0
##       2       3      0         0       0      1     3     0       0         0
##       4       4      0         0       0      0     2     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       5      0         0       0      0     0     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##       0       5      0         0       0      0     0     0       1         0
##       1       2      0         0       0      1     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     1     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##      15       9      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8       8      0         0       0      0     0     0       0         0
##       9       7      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         1       0      0     0     0       0         0
##       4       7      0         2       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       2       5      0         0       0      0     1     0       0         0
##       3       6      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8       9      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       6      0         0       0      0     1     0       0         0
##       0       6      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      12      10      0         0       0      0     2     0       0         0
##       1       8      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       9       2      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       1      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         1       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       1      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     1     0       0         0
##       4       1      0         0       0      0     0     1       0         0
##       3       1      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     1       0         0
##       5       5      0         0       0      0     0     0       0         0
##       9      17      0         1       0      0     0     1       0         0
##       0       1      0         0       0      0     0     0       0         0
##      12       4      1         0       0      0     0     0       0         0
##       5       5      0         0       0      0     0     1       0         0
##       2       1      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       4       0      0         0       0      0     0     0       0         0
##       3       3      1         0       0      0     0     0       0         0
##       2       5      0         0       0      0     0     0       0         0
##       3       7      0         0       0      0     0     0       0         0
##       2       5      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       0      10      0         0       0      0     0     0       0         0
##       0      10      0         0       0      0     1     0       0         0
##       0       9      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       4       3      1         0       0      0     0     1       0         0
##       4       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       5       8      0         0       0      0     0     0       0         0
##       1       7      0         0       0      0     1     0       0         0
##       2       4      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         1       0      0     0     0       0         0
##       1       3      0         1       0      0     0     0       0         0
##       0       0      0         1       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      27      30      0         1       0      0     0     0       0         0
##      26       8      0         0       0      2     1     4       0         0
##      23      11      0         1       0      0     1     0       0         0
##      17      21      0         0       0      1     1     0       0         0
##       4      14      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8       5      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         1       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      1     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       3      13      0         0       0      0     0     0       0         0
##      20       5      1         0       0      0     0     2       0         0
##      12      14      0         0       0      0     0     0       0         0
##      12      13      0         0       0      0     0     0       0         0
##      17      19      0         0       0      0     6     0       0         0
##      26      13      0         1       0      0     1     1       0         0
##      12      17      0         2       0      0     0     0       0         0
##      28      23      1         1       0      0     0     0       0         0
##       7      10      0         2       0      0     0     0       0         0
##       5       1      0         1       0      0     0     0       0         0
##      17      13      0         3       0      0     1     0       0         0
##      10      10      0         2       0      0     0     0       0         0
##      27      22      1         2       0      0     0     0       0         0
##       9       2      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     1     0       0         0
##       1       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       7      0         1       0      0     1     0       0         0
##      17      20      0         3       0      0     1     0       0         0
##      13       7      0         2       0      1     1     0       0         0
##      17      13      0         3       0      0     1     0       0         0
##       2       0      0         0       0      0     1     0       0         0
##       2       0      0         0       0      0     1     0       0         0
##       2       0      0         0       0      0     1     0       0         0
##       2       0      0         0       0      0     1     0       0         0
##       3       1      0         0       0      0     1     0       0         0
##       3       0      0         0       0      0     1     0       0         0
##       3       0      0         0       0      0     1     0       0         0
##       3       0      0         0       0      0     1     0       0         0
##       3       1      0         0       0      0     1     0       0         0
##       3       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       2      17      0         0       0      0     0     0       0         0
##       1       1      0         0       1      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       4       2      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         1
##       4      11      0         0       0      0     2     0       0         0
##       1       6      0         0       0      0     1     0       0         0
##       3       4      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     2     0       0         0
##       2       3      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       5       3      1         0       0      0     1     0       0         0
##       1       0      0         0       0      0     1     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       3       2      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       5       2      0         0       0      0     1     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       1      0     1     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       8       6      0         0       0      0     2     0       0         0
##      23       7      0         0       0      0     0     0       0         0
##      27      17      0         1       0      1     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       4       3      0         0       0      0     0     0       0         0
##       1       4      0         0       1      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         1       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      1         0       1      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      1     0     0       0         0
##      16      17      0         0       0      1     2     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      27      28      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##      12       1      0         0       0      0     1     0       0         1
##       5       1      0         0       0      0     1     0       0         1
##      18      18      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      1         0       0      1     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       5      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       9       9      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         1
##       0       0      0         0       0      0     0     0       0         0
##       1       6      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      1         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     2     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      1     0     0       0         0
##       3       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       7       7      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     1     1       0         0
##       0       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       7      0         0       0      0     2     3       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       5      0         1       0      0     0     0       0         0
##       7       3      0         1       0      0     0     0       0         0
##       7       4      0         0       0      0     1     0       0         0
##       1      10      0         1       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     1     0       1         0
##       2       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         1       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       8      0         0       0      2     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       9       1      0         0       0      0     1     0       0         0
##       9       7      0         0       0      1     0     0       0         0
##      18      12      0         0       0      1     0     0       0         0
##      16      11      0         0       0      2     0     0       0         0
##       6       1      0         0       0      0     0     0       0         0
##      39      12      0         1       0      3     2     0       0         0
##      16       3      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         1
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      1         0       0      0     0     0       0         0
##       1       6      1         0       0      0     5     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       6      1         0       0      0     2     0       0         0
##       1      11      0         0       0      0     1     0       0         0
##       1       4      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      1         0       0      0     1     0       0         0
##       1       2      0         0       0      0     2     0       0         0
##       1       2      0         0       0      0     0     1       0         0
##       4       6      0         0       0      0     2     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       2       4      1         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##      10      14      1         0       0      0     2     0       0         0
##       9       5      0         0       0      0     1     0       0         0
##       8       2      1         0       0      0     4     0       0         0
##       0       2      1         0       0      0     0     0       0         0
##      12       2      0         0       0      0     6     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       5      1         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       2      11      1         0       0      0     6     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8       7      0         2       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       3       6      0         0       0      0     0     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       1       3      1         0       0      1     1     0       0         0
##       1       3      1         0       0      0     1     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       1       5      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     1       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     2       0         0
##      13       5      0         0       0      0     1     2       0         0
##       2       2      0         0       0      0     1     2       0         0
##       1       3      0         0       0      0     1     0       0         0
##       1       5      0         0       0      0     1     2       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      18      16      0         0       0      0     0     0       0         1
##      12      10      0         0       0      0     1     0       0         1
##       5       9      0         0       0      0     1     0       0         0
##      13      15      0         0       0      0     0     0       0         1
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     1     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       6       5      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       4      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     1     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       0       4      0         0       1      1     1     2       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       8      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       5      0         0       0      0     2     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     1     0       0         0
##       2       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      1     0     0       0         0
##       2       6      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      1     0     0       0         0
##       0       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       2      0         0       0      1     1     0       0         0
##       0       2      0         0       0      1     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         1       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       8      0         1       0      0     0     0       0         0
##       0       6      0         0       0      0     1     0       0         0
##       2       4      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         1       0      0     1     0       0         0
##       5       2      0         0       0      0     0     1       0         0
##       7       1      0         0       0      0     4     0       0         0
##       0       4      1         0       0      0     0     0       1         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       3      0         0       0      0     0     1       0         0
##       1       3      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##      13      29      1         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       1      0     2     0       0         0
##       0       4      0         0       0      0     2     0       0         0
##       4       4      0         0       0      0     2     0       0         0
##       0       1      0         0       0      0     1     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     1       0         0
##       1       3      0         0       0      0     0     0       0         0
##       6       3      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       3       7      0         0       0      0     1     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       9       4      1         0       0      0     0     1       0         1
##       2       1      0         0       0      0     0     0       0         2
##       2       5      0         0       0      0     1     0       0         1
##       1       3      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     1     0       0         0
##       2       1      0         0       0      0     1     0       0         0
##       6       4      0         0       0      0     4     0       0         1
##       3       7      0         0       0      0     3     0       0         1
##       1       6      0         0       0      0     1     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         1       0      0     0     0       0         0
##       8       2      0         0       0      1     2     1       0         0
##      13       3      1         0       0      0     2     1       0         2
##       5       4      0         0       0      0     1     1       0         2
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      1     2     2       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       3      1         0       0      1     0     0       0         0
##       2       5      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       6       2      0         0       0      1     0     0       0         0
##       2       0      0         0       0      1     0     0       0         0
##       3       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       8       5      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       3      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       3      0         1       1      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0      10      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       6      1         0       0      0     1     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     1     0       0         0
##       2       1      1         0       0      0     2     0       0         0
##       5       3      2         0       0      0     2     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      2     0     0       0         0
##       1      10      0         0       0      2     0     0       0         0
##       2      12      0         0       0      0     0     0       0         0
##       6       1      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     1     0       0         0
##       3      12      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     1       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     1       0         0
##       0       2      0         0       0      0     0     0       0         0
##       4       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       3      0         0       1      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##      17      12      1         0       0      0     4     0       1         0
##       0       2      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     1     0       0         0
##       6       2      0         0       0      1     3     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##      11       7      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       2      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       4       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     1       0         0
##       0       1      0         0       0      0     1     2       0         0
##       0       1      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     1       0         0
##       0       1      0         0       0      0     1     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     1       0         0
##       0       1      0         0       0      0     1     0       0         1
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         1       0      0     1     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      1         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4      10      0         3       0      1     0     0       0         0
##       4       7      0         1       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       6       5      1         0       1      1     2     0       0         0
##       0       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4      11      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         2
##       2       5      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     1     0       0         0
##      23      33      0         0       0      0     0     0       0         0
##       5       6      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       2      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       6      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       6      0         0       0      0     0     0       0         0
##       1       7      0         0       0      0     1     0       0         0
##       0      12      0         0       0      0     1     0       0         0
##       1       3      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       3      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     1     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     2     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       9      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      2     0     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       4      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       2       9      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       4      0         1       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      1     2     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       4       5      0         0       0      0     1     0       0         0
##       4       2      0         0       0      0     0     0       0         0
##       5       7      1         1       0      1     2     0       0         0
##       0       2      0         0       0      1     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     1     0       0         0
##       2       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       3       5      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     1     0       0         0
##       1       4      0         0       0      0     0     1       0         0
##       1       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       7       0      0         0       0      0     1     1       0         0
##       5       4      0         0       0      1     0     0       0         0
##       5       2      0         1       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##      17       7      0         0       0      0     1     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       7       4      0         0       0      0     1     0       0         0
##      18       3      0         2       1      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     1     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8       1      0         0       0      0     0     1       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       6       5      0         0       0      1     0     0       0         0
##       0       1      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         1
##       1       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       8      26      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     2     0       0         0
##       2       0      0         0       0      0     2     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       6      16      0         1       0      0     0     0       0         0
##       7      29      0         1       0      0     0     0       0         0
##      21      42      1         0       0      1     4     1       0         0
##      12      20      0         1       0      2     7     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       2       1      0         0       0      1     0     2       0         0
##       1       2      0         0       0      0     0     1       0         0
##       0       1      0         0       0      0     0     1       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       2       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       2       3      1         0       0      0     0     0       0         0
##       8      14      0         0       0      0     0     0       0         0
##       8       8      0         0       0      0     2     0       0         0
##      26      28      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##      10      11      0         0       0      1     0     0       0         0
##      11       1      0         0       0      0     0     0       0         0
##       2      12      0         0       0      0     1     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##      14      13      0         0       0      1     0     0       0         0
##      15      16      0         0       0      1     0     0       0         0
##       4       9      0         0       0      0     0     0       0         0
##      39      36      0         0       0      0     1     0       0         0
##       1       6      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##      25      14      0         0       0      1     0     0       0         0
##       3       5      1         0       0      0     0     0       0         0
##       1       4      0         0       0      0     3     0       0         0
##       5       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      19       8      0         0       0      0     1     0       0         0
##      17      11      0         0       0      0     0     0       0         0
##      30      46      0         0       0      2     4     0       0         0
##       3       9      1         0       0      1     0     0       0         0
##       3       7      0         0       0      0     2     0       0         0
##      14      12      0         0       0      0     4     0       0         0
##       1       1      0         0       0      0     1     0       0         0
##       4       8      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      1         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       5       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         1       0      0     0     1       0         0
##       0       4      0         1       0      0     0     1       0         0
##       4       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       4       2      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       9      2         1       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       2      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      1         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       6       1      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       4      0         2       3      0     2     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       5       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       1         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       3       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       3       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2      14      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     1     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##      16       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      1     2     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     1     0       0         0
##       3       3      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       4       2      0         0       0      0     0     0       0         0
##      13      11      1         0       0      0     0     0       0         0
##       9       8      0         0       0      0     0     0       0         0
##      50      28      0         1       0      0     2     0       0         0
##      11      11      1         1       0      0     4     1       0         0
##      13      11      0         0       0      1     0     0       0         0
##      33       4      0         0       0      0     1     4       0         0
##       4       5      0         0       0      0     1     0       0         0
##      16      12      0         1       0      0     1     0       0         0
##      60      20      1         1       0      0     2     2       0         0
##       3       1      0         0       0      0     1     0       0         0
##      47      14      1         3       0      1     1     0       0         0
##       6       2      0         0       0      0     1     0       0         0
##      20       8      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      20       4      0         0       0      0     1     0       0         0
##      10       9      0         0       0      0     0     0       0         0
##      46      36      0         2       0      0     4     0       0         0
##      27       6      0         2       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      56      29      0         1       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     2       0         0
##       2       4      0         0       0      0     0     0       0         0
##       9       5      0         0       0      0     0     2       0         0
##       1       4      0         0       0      0     0     0       0         0
##       4       3      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     2       0         0
##       6      12      0         0       0      0     0     2       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       5      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       5       5      0         0       0      1     0     0       0         0
##       5       3      0         0       0      0     0     0       0         0
##       6       5      0         0       0      0     0     0       0         0
##      16      13      0         0       0      0     0     1       0         0
##       7       3      0         0       0      0     0     1       0         0
##       6       6      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       5      0         0       0      0     1     0       0         0
##       5       3      0         0       0      0     1     0       0         0
##       4       2      0         0       0      0     1     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       6       9      0         3       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       3      0         2       0      0     0     0       0         0
##       2       7      0         6       0      0     0     0       0         0
##       1       0      0         2       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3      25      0         0       0      1     1     0       0         0
##       4      12      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       9      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       8       2      0         0       0      0     0     0       0         0
##       2       1      0         0       0      2     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         1       0      2     0     0       0         0
##       0       3      0         1       0      0     0     0       0         0
##       4       5      0         2       0      2     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       9      0         0       0      0     0     0       0         0
##       3       3      0         0       0      0     0     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##       6       6      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##      11       0      0         0       0      0     0     2       0         0
##       0       1      0         0       0      0     0     0       0         0
##       9       1      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     1       0         0
##       1       1      0         0       0      0     0     2       0         0
##      15       2      0         0       0      0     0     2       0         0
##       0       3      0         1       0      0     1     0       0         0
##       4       4      0         0       1      0     2     0       0         0
##      20      14      0         0       1      0     1     1       0         0
##      41      14      0         1       3      0     1     2       0         0
##       0       0      0         0       0      1     0     0       0         0
##       4       1      0         0       0      0     1     0       0         0
##       4       1      0         0       2      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       7       5      0         0       2      0     1     0       0         0
##       1       1      0         0       0      0     0     4       0         0
##       0       3      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     1     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       7      24      0         0       0      1     5     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         1       0      0     2     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     2     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       4      0         1       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       2       5      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      1         0       0      0     1     1       0         1
##       1       0      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     1       0         0
##       1       0      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     1     1       0         0
##       1       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       6      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     1       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       4      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       1      0     0     0       0         0
##       0       1      0         0       0      1     0     0       0         0
##       4       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       1         0
##       2       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       1      0         0       0      0     0     1       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     1     0       0         0
##       8       0      0         0       0      0     1     0       0         0
##       5       0      0         0       0      0     1     0       0         0
##       8       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4      14      0         0       0      0     0     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##       1       7      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1      15      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       7      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       5      0         0       0      0     0     1       0         0
##       3       1      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       1      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     1     0       0         0
##       9       5      0         0       0      0     0     3       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       2       5      0         0       0      0     1     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       7      11      0         0       0      0     2     2       0         0
##       1       8      0         1       0      0     1     0       0         0
##       5       8      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       4       9      0         0       0      0     0     5       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     1       0         0
##       2       0      0         0       0      0     0     0       0         0
##       8      18      0         1       0      0     1     0       0         0
##       9      28      0         0       0      0     0     2       0         0
##      20      27      1         0       0      0     0     1       0         0
##      19       7      0         0       0      0     2     0       0         0
##       8       3      0         0       0      0     0     1       0         0
##       5      18      0         0       0      1     0     1       0         0
##       2       1      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     3     1       0         0
##       3       1      0         1       0      0     0     0       0         0
##       0       1      1         0       0      0     0     0       0         0
##       1       3      0         0       0      0     4     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##      25       7      0         0       0      0     2     0       0         0
##      22       8      0         0       0      0     2     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     1     1       0         0
##       2       5      0         1       2      1     0     0       0         0
##      15      16      0         1       2      1     2     1       0         0
##      12      10      0         1       0      1     1     0       0         0
##      10       8      0         1       2      1     0     0       0         0
##      40      39      0         1       0      1     2     0       0         0
##      10      11      0         1       0      0     1     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       7      0         0       0      0     1     0       0         0
##       0       1      0         0       1      0     0     0       0         0
##       0       1      0         0       1      0     0     0       0         0
##       0       0      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4      20      0         0       0      0     1     1       0         0
##       0       3      0         0       0      0     1     0       0         0
##       4       3      0         0       0      0     1     0       0         0
##       1      11      0         0       0      0     0     1       0         0
##       1      13      0         0       0      0     0     1       0         0
##       1       3      0         0       0      0     0     3       0         0
##       1       0      0         0       0      0     0     0       0         0
##      32      12      0         0       0      1     0     2       0         0
##       1       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     2       0         0
##       6       4      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     1       0         0
##       6       3      0         0       0      1     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       5       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       1      1         0       0      0     0     0       0         0
##       9       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       4       1      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       4      0         0       0      1     1     0       0         0
##       3       7      0         0       0      0     0     0       0         0
##       2       5      1         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##      22       5      0         0       0      2     0     3       1         0
##       0       1      0         1       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       0       5      0         1       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       3      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       5       6      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      1     0     0       0         0
##       1       2      0         0       0      1     0     0       0         0
##       1       3      0         0       0      1     0     0       0         0
##       3       4      0         0       0      1     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       5       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       7       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     1     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       7      0         0       0      0     0     1       0         0
##       2      13      0         0       0      0     0     0       0         0
##       7       5      0         0       0      0     0     1       0         0
##       4       2      0         0       0      1     0     0       0         0
##       8       2      0         0       0      1     0     0       0         0
##       3       2      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       4      0         1       0      0     1     0       1         0
##       0       0      0         0       0      0     3     0       0         0
##       7       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       2       2      1         0       0      0     0     0       0         0
##      13       6      0         2       0      2     0     0       0         0
##      10       9      0         0       0      0     3     3       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      12       9      0         0       0      0     0     2       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     1       0         0
##       2       3      0         0       0      0     1     0       0         0
##       5       0      0         0       0      0     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##      10      18      0         2       0      1     0     0       0         0
##       8      12      0         1       0      1     0     0       0         0
##       0       0      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       3      0         1       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       7      0         0       0      1     0     1       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       7      0         0       0      0     2     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       1      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       7      0         0       0      0     1     0       0         0
##       0       2      0         0       1      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       7       2      1         0       0      0     1     1       0         0
##       1       4      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      1     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       2      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       2       9      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       3      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       5       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       2      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5      13      0         0       0      0     0     0       0         0
##       1       4      0         1       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##       4       5      0         1       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8      10      0         4       0      1     0     0       0         0
##       6       2      0         0       0      0     0     0       0         1
##       3       1      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       6      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       4      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       4      0         0       0      1     0     1       0         0
##       9      11      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      66      53      0         1       0      0     6     0       0         0
##      23      10      0         1       0      1     4     0       0         1
##      54      49      0         1       0      1     1     0       0         1
##      32      32      0         0       0      0     2     0       0         0
##      15       9      0         0       0      1     1     0       0         0
##      68      64      0         1       0      1     5     0       0         1
##       4       1      0         0       0      0     0     1       0         0
##       6       0      0         0       0      0     1     0       0         0
##       2       1      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      1     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       7      0         1       0      0     0     0       0         0
##       4       3      0         0       0      0     1     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       6       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      1     0     0       0         0
##       0       7      0         0       0      0     0     0       0         0
##      12       3      0         0       0      1     2     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##      13       5      0         0       0      0     1     0       0         0
##      17       9      0         0       0      0     2     0       0         0
##      24       9      0         0       0      0     2     0       0         0
##      14       6      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##     300     374      3         2       0      0    17     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     1       0         0
##       1       3      0         0       0      1     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       2      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      11       2      0         0       0      0     1     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      74      23      1         0       3      0     2     4       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1      13      0         0       0      0     2     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##      11       2      0         0       0      0     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##       1      12      0         0       0      0     4     0       0         0
##       1       7      0         0       0      0     4     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       3       6      0         0       0      0     0     0       0         0
##       6      10      0         1       0      1     0     0       0         0
##      10       8      0         1       0      0     0     0       0         0
##      10      10      0         2       0      1     0     0       0         0
##      12       7      0         0       0      1     0     0       0         0
##      12      10      0         2       0      2     0     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##      10       9      0         0       0      0     6     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##      27      21      0         3       0      0     1     0       0         2
##       3       5      0         1       1      0     0     0       0         0
##       7       3      0         0       0      0     0     0       0         0
##       4       3      0         0       0      0     0     1       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       4      0         0       0      1     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       3      0         0       0      1     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       1      0         0       2      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       6      12      0         0       0      1     0     0       0         2
##       2       2      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       6       3      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8      25      0         0       0      1     1     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       4       0      0         0       0      0     2     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       6       5      0         0       0      0     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       4      0         0       1      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       3       6      0         0       0      0     0     0       0         0
##       3       1      0         1       0      2     0     0       0         0
##      15      19      0         4       0      1     0     0       0         0
##      10       8      0         0       0      0     0     0       0         0
##      19      17      0         3       0      0     1     0       0         0
##      38      32      0         1       0      2     3     1       0         0
##      27      20      0         4       0      1     0     0       0         1
##      19      32      0         2       0      1     0     0       0         0
##       1       2      0         0       0      0     0     0       0         0
##      54      30      1         2       0      0     3     3       0         0
##       6       2      0         0       0      0     1     0       0         0
##       7      20      0         3       1      1     0     0       0         0
##       0       3      0         0       2      0     0     0       0         0
##       3       7      0         0       0      0     0     1       0         0
##      28      13      1         1       0      0     2     0       0         0
##      13      21      0         1       0      2     0     0       0         0
##       1       3      0         0       0      0     0     0       0         0
##       7       9      0         0       1      0     0     0       0         0
##       3      11      0         0       0      0     1     3       0         0
##       4      11      0         0       0      1     1     0       0         0
##      13       7      0         0       0      0     0     0       0         0
##      11       5      0         0       0      0     1     0       0         0
##       1       3      0         0       0      0     0     2       0         0
##       9       9      0         0       0      0     1     0       0         0
##      10      16      0         0       0      0     0     0       0         0
##       4       2      0         0       0      0     1     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##      15      15      0         0       0      1     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       6      11      0         0       0      0     1     0       0         0
##       5       4      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       3      14      0         0       0      1     2     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       5       7      0         2       0      0     1     5       0         0
##       0       1      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1      21      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##      71      44      0         1       5      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##      12      14      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       4       3      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       1       1      1         0       0      0     0     0       0         0
##       2       0      1         0       0      0     0     0       0         0
##      49      63      1         2       4      3     5     0       1         0
##       6       5      0         0       2      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       7       9      0         0       1      1     0     0       0         0
##       4       0      0         0       0      0     0     0       0         0
##       3       3      0         0       1      1     0     0       0         0
##       1       3      0         0       1      1     0     0       0         0
##       6       4      0         0       1      2     1     0       0         0
##       1       3      1         0       0      0     0     0       0         0
##       1       0      0         0       2      0     0     0       0         0
##       9       4      0         0       2      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     1     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       8       5      0         0       0      0     0     0       0         0
##       7       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##      22      13      0         1       0      0     0     0       0         0
##       0       3      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##      10      10      0         1       0      0     1     0       0         0
##       3       3      0         1       0      1     0     0       0         0
##       9       6      0         0       0      0     4     0       0         0
##       1      10      0         0       0      1     0     0       0         0
##      24      28      0         1       0      1     1     1       0         0
##       0       6      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##      34      26      1         5       0      2     7     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      22       9      0         0       2      0     1     0       0         0
##       4       1      0         0       0      1     0     0       0         0
##       2       5      0         0       0      0     0     0       0         0
##       4       7      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       2       4      0         0       0      0     1     0       0         0
##       2       5      0         0       0      0     0     0       0         0
##       2       4      0         0       0      0     0     0       0         0
##       8      10      0         0       0      0     0     0       0         0
##       2       2      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       5       6      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       0         0
##       2       6      0         0       0      0     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      16      15      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       7       5      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       5       5      0         0       0      0     1     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       8       6      0         0       0      0     0     0       0         0
##       6       3      0         0       0      0     0     0       0         0
##       2       2      0         0       0      1     0     2       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2      11      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       1      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1      13      0         0       0      0     0     1       0         0
##       0       0      0         0       0      1     0     0       0         0
##       1       2      0         0       0      2     0     0       0         0
##       0       1      0         0       0      1     0     0       0         0
##       0       2      0         1       0      0     0     0       0         0
##       0       0      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##      11       2      1         0       2      1     1     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       1      1         0       0      0     0     0       0         0
##       5       2      1         0       0      0     1     0       0         0
##       3      15      0         0       0      1     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      43      72      0         2       0      1     2     2       0         0
##       4      14      1         2       0      0     1     0       0         0
##      62     113      1         3       0      2     6     1       0         0
##       4      12      0         0       0      0     0     1       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       3       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      1         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       2      0         0       0      0     0     0       1         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       2       0      0         0       1      0     0     0       0         0
##       4      17      0         0       0      0     0     0       0         0
##       5       8      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       1       2      1         0       0      1     0     0       0         0
##       1      21      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     1     0       0         0
##       0       0      0         0       0      1     0     0       0         0
##       7       8      1         0       0      0     1     0       0         0
##       1       2      0         0       0      0     1     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       4       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       2       3      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       7       5      0         0       0      0     0     0       0         0
##       6       1      0         0       0      0     0     1       0         0
##      10       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       3       2      0         0       0      0     0     0       0         0
##       6       3      0         0       0      0     0     0       0         0
##       6       6      0         0       0      0     0     1       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       5      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       9      23      0         1       0      1     1     1       0         0
##      17       8      0         1       0      0     0     0       0         0
##       1       4      0         0       0      0     0     0       0         0
##       7      10      1         0       0      0     0     1       1         0
##       2      11      0         3       0      0     4     4       0         0
##       2       2      0         0       0      0     0     1       0         0
##       0       0      1         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       6       0      0         0       0      0     0     0       0         0
##       3       1      0         0       0      0     0     0       0         0
##       6       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     1       0         0
##       3       8      0         0       1      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       5       7      0         0       0      0     0     0       0         0
##       3       3      0         0       0      0     1     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       2       1      0         1       0      0     0     0       0         0
##      11      10      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       4      0         0       0      0     0     0       0         0
##       1       1      0         0       0      0     0     0       0         0
##      15      13      1         0       0      1     2     0       0         0
##       3       3      0         0       0      1     0     1       0         0
##      14      19      0         0       0      1     2     0       0         0
##       2       4      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##      12      19      0         0       0      1     2     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       0       0      0         0       0      0     0     0       0         0
##       0       5      0         0       0      0     1     0       0         0
##       0       3      0         0       0      0     1     0       0         0
##       0       5      0         0       0      0     0     0       0         0
##       0       4      0         0       0      0     1     0       0         0
##       3       3      0         0       0      0     0     0       0         0
##       2       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     0       0         0
##       0       1      0         0       0      0     0     0       0         0
##       1       0      0         0       0      0     0     1       0         0
##  Malta Netherlands Norway Poland Portugal RSA Saudi Arabia Singapore Spain
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           5      1      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           1      0      0        2   0            0         0     1
##      0           1      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         1     0
##      0           1      0      0        3   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           1      1      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      1           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      2      3        2   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           2      3      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     0
##      1           7      0      0        0   0            0         0     1
##      0           0      1      2        0   0            0         0     1
##      0           6      3      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     1
##      0           3      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           7      2      0        1   0            0         0     3
##      0           3      1      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           3      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           1      1      0        3   0            0         0     1
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      1        7   1            0         0     6
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           7      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        3   0            0         0     1
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        3   0            0         0     1
##      0           0      0      0        2   0            0         0     6
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           4      0      1        0   0            0         0    15
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           6      1      0        2   0            0         0     0
##      0           1      1      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           5      3      0        5   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0          10      3      0        3   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      1      0        4   0            0         1     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      1      0        1   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     2
##      0           1      3      1        1   0            0         0     7
##      0           1      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      4      1        0   0            0         0     6
##      0           1      2      0        1   1            0         0     6
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        1   0            0         1     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   1            1         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      2      0        4   0            0         0    12
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     5
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     2
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        2   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        1   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     2
##      1           2      3      1       12   1            0         0     6
##      1           1      3      1        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      3      0        1   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      1        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   1            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      2      0        2   0            0         2     1
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      1        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        4   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     1
##      0           0      0      1        1   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   1            0         0     0
##      0           0      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      2      0        1   0            0         0     5
##      0           0      1      0        0   0            0         0     2
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      1        0   0            0         0     0
##      0           6      5      3        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         2     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     4
##      0           0      5      0        5   0            0         0     5
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      1        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        3   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      2      1        1   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     1
##      0           3      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           5      0      0        1   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     1
##      0           0      1      0        0   0            0         0     1
##      0           3      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      0      0        1   0            0         0     2
##      0           0      0      0        3   0            0         0     3
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        1   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        3   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      2      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      4      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      2      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         1     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     2
##      0           0      0      1        0   0            0         0     1
##      0           2      0      0        1   0            0         0     2
##      0           0      1      0        3   0            0         0     1
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      1        1   0            0         0     5
##      0           0      0      0        5   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      2      0        0   0            0         0     1
##      0           6      5      1        1   0            0         0     6
##      0           2      1      0        0   0            0         0     4
##      0           7      3      0        0   0            0         0     5
##      0           6      1      0        0   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      1      0        0   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      3      0        0   0            0         0     4
##      0           0      0      0        0   0            0         1     0
##      0           6      1      0        4   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           2      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        1   0            0         0     0
##      0           0      0      0        2   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           2      1      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     5
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        1   0            0         0     0
##      0           3      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         2     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      1           0      0      0        1   0            0         0     3
##      0           9      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           5      2      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0          12      0      0        0   0            0         0     2
##      1           9      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        1   0            0         0     0
##      0           1      0      0        1   1            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           4      2      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        1   0            0         0     0
##      0           0      0      3        0   0            0         0     2
##      0           0      0      4        2   0            0         0     1
##      0           0      2      4        4   0            0         0     1
##      1           0      0      2        2   0            0         0     2
##      2           0      0      3        1   0            0         0     2
##      0           2      0      0        0   0            0         0     3
##      0           0      3      0        0   0            0         0     4
##      0           0      0      0        1   0            0         0     0
##      0           2      1      0        1   0            0         0     0
##      0           0      0      2        0   0            0         0     2
##      0           1      1      3        5   0            0         0     5
##      0           0      0      3        2   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           2      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           8      0      0        2   0            0         0     2
##      0           9      1      0        4   0            0         0     3
##      0          11      0      0        5   0            0         0     1
##      0          11      0      0       10   0            0         0     3
##      0           7      0      0        4   1            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      1        3   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         1     0
##      0           0      2      1        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        1   0            0         0     0
##      0           8      3      0        2   0            0         0     4
##      0           2      0      0        0   0            0         0     1
##      0           3      1      0        0   0            0         0     2
##      0           7      1      1        0   0            0         0     0
##      0          13      1      0        0   0            0         1     2
##      1           5      1      0        0   0            0         2     2
##      1           6      1      0        1   0            0         2     3
##      0           2      1      0        1   0            0         1     4
##      0           1      1      0        0   0            0         2     2
##      1           6      1      0        1   0            0         1     5
##      0           1      1      0        0   0            0         2     3
##      1           8      2      0        0   0            0         1     3
##      0           3      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   1            0         0     0
##      1           1      3      0        0   0            0         0     2
##      1           1      8      0        0   0            0         0     2
##      1           1      6      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      2           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     6
##      0           0      2      0        2   0            0         0     0
##      1           0      4      0        1   0            0         0     1
##      0           0      4      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        2   0            0         0     5
##      0           0      0      0        2   0            0         0     2
##      0           3      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        2   0            0         1     1
##      0           1      0      0        1   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         1     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           2      0      0        0   0            0         0     0
##      0           1      2      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      2           1      0      1        0   0            0         0     1
##      0           1      0      0        3   0            0         1     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        4   0            0         1     1
##      0           1      0      0        1   0            0         0     1
##      0           0      1      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        1   0            0         2     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      1      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0          11      4      0        0   0            0         0     5
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           1      2      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      4      0        0   1            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      1      0        1   1            0         0    10
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      4      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        2   0            0         0     0
##      0          10      3      0        6   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     5
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        2   0            0         1     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        5   0            0         0     2
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0          10      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           8      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   1            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      2      1        0   0            0         0     1
##      0           0      1      0        1   0            0         1     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      1      0        0   0            0         0     5
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      1      0        0   0            0         0     2
##      1           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      3      0        1   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     2
##      0           1      1      0        0   0            0         0     1
##      0           8      0      0        1   0            0         0     3
##      0           3      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           5      0      0        0   0            0         0     2
##      0           5      1      0        0   0            0         0     0
##      1           6      2      0        0   0            0         0     2
##      1           6      2      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0          22      5      0        1   0            0         0     9
##      0           4      1      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           2      0      1        6   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           2      0      0        3   0            0         0     3
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     5
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           2      2      4        1   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        3   1            0         2     1
##      1           0      0      0        0   0            0         2     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     2
##      0           0      1      0        0   0            0         0     0
##      0           2      3      0        2   0            0         3     1
##      0           0      0      0        0   0            0         1     1
##      0           1      0      0        1   0            0         0     7
##      0           0      0      0        2   0            0         0     1
##      0           0      0      0        0   1            0         3     2
##      0           0      0      0        0   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     3
##      0           0      0      0        0   0            0         0     2
##      0           2      1      0        2   0            0         0     4
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   1            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        2   0            0         0     1
##      0           1      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     1
##      0           1      1      0        0   0            0         1     0
##      0           1      1      0        0   0            0         1     1
##      0           1      1      0        0   0            0         0     0
##      0           1      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           2      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        2   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      3        0   0            0         0     0
##      0           0      1      2        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     1
##      0           2      0      0        1   0            0         0     2
##      0           2      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           2      0      0        1   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           2      0      0        1   0            0         0     1
##      0           2      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      3      1        0   0            0         0     2
##      0           0      0      0        0   0            0         0     3
##      0           0      1      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     2
##      0           0      0      0        1   0            0         0     2
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      1        0   0            0         0     5
##      0           0      0      0        1   0            0         0     2
##      0           0      1      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     2
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      1           3      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           1      2      0        2   0            0         0     5
##      0           0      1      0        0   0            0         0     1
##      0           2      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        3   0            0         0     4
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        2   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      1      2        0   0            0         0     0
##      2           0      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        1   0            0         0     2
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0          13      7      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           2      0      1        0   0            0         0     0
##      1           3      0      0        0   0            0         0     2
##      0           0      0      0        1   0            0         0     1
##      0           2      0      0        0   0            0         0     0
##      0           1      0      0        1   0            0         0     3
##      0           2      1      0        0   0            0         0     1
##      0           3      1      0        0   0            0         0     0
##      0           2      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        1   0            0         0     2
##      0           0      0      0        1   0            0         0     4
##      0           1      0      0        2   0            0         0     0
##      0           0      1      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     2
##      0           2      0      0        1   0            0         0     4
##      0           2      0      0        1   0            0         0     2
##      0           0      4      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           1      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      1           1      0      0        0   0            0         0     0
##      0           6      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     2
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           5      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           5      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      1        0   0            0         0     1
##      0           8      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           9      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      1        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      1      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      1        0   0            0         0     0
##      0           0      1      1        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      1        0   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      7        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      1      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           0      3      0        0   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        6   0            0         0     2
##      0           0      1      0        2   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      1      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         2     6
##      0           0      1      0        1   0            0         2     1
##      0           0      2      0        1   0            0         0     0
##      0           0      4      0        0   0            0         0     3
##      0           6      3      0        2   0            0         0     4
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      2      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        1   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      1      0        2   0            0         0     0
##      0           2      0      0        3   0            0         0     1
##      0           2      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      1      0        0   0            1         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            1         0     0
##      0           0      0      0        0   0            1         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            1         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      3           0      0      0        3   0            0         1     6
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      3      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         2     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           5      0      0        0   1            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           4      1      0        0   0            0         1     6
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           2      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     2
##      0           2      0      0        4   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      4      0        2   0            0         0     4
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        3   0            0         0     0
##      0           0      0      0        1   0            0         0     2
##      0           0      1      0        1   0            0         0     0
##      0          13      5      1        0   1            0         0     2
##      0           0      0      2        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      4      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           1      0      1        0   0            0         0     0
##      0           1      0      0        0   0            0         0     2
##      0           3      0      0        1   0            0         0     0
##      0           2      1      0        0   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     0
##      0           1      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           5      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           2      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        6   0            0         0     0
##      0           1      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           3      0      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        1   0            0         0     0
##      0           3      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     1
##      0           0      0      3        1   0            0         1     4
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        1   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        3   0            0         0     2
##      0           0      0      0        0   0            0         1     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     5
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           1      0      1        1   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           1      0      1        1   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        2   0            0         0     5
##      0           1      0      2        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        2   0            0         0     5
##      0           0      1      0        0   0            0         0     6
##      1           0      0      3        2   0            1         1     3
##      0           4      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      2        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     1
##      0           0      1      0        2   0            0         0     1
##      0           0      1      0        2   0            0         0     0
##      0           1      5      0        2   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           2      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         1     1
##      0           0      0      0        1   0            0         0     2
##      0           2      0      0        0   0            0         0     0
##      0           1      0      0        3   0            0         0     0
##      0           2      0      0        2   0            0         0     5
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      1        1   0            0         1     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        1   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     1
##      0           8      7      5        0   1            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           3      2      1        0   0            0         0     0
##      0           4      2      2        0   0            0         0     3
##      0           5      2      4        5   0            0         1     5
##      1           9      0      3        2   1            0         1    14
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         1     0
##      0           0      1      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        3   0            0         0     1
##      0           6      0      0        3   0            0         0     1
##      0           6      1      0        3   1            0         0     1
##      0           5      1      0        1   0            0         0     0
##      0           2      1      0        0   0            0         0     0
##      0           4      0      0        4   0            0         0     3
##      0           4      0      0        3   0            0         0     1
##      0           7      0      0        2   0            0         0     1
##      0           3      0      0        5   0            0         0     2
##      0           4      0      0        0   0            0         0     1
##      0           8      0      0        5   0            0         1     3
##      0           4      0      2        9   0            0         1     4
##      0          14      1      0        8   1            0         2     5
##      0           3      0      0        9   0            0         1     1
##      0           1      0      0        1   0            0         0     1
##      0           7      0      0        3   0            0         1     0
##      0           5      0      0        2   0            0         0     0
##      0           2      0      0        2   0            0         0     2
##      0           1      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        4   1            0         0     3
##      0           0      0      0        4   0            0         0     0
##      0          11      2      1        1   0            0         0     4
##      0           3      0      0       11   1            0         0     1
##      0           6      0      1        0   0            0         0     0
##      0           2      0      0        5   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      2      0        0   0            0         0     0
##      0           1      2      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      1           0      0      0        0   0            0         0     2
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      0           2      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        1   0            0         3     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      3      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      4        0   0            0         0     2
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      4      1        0   0            0         0     0
##      0           0      3      7        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      3        2   0            0         0     4
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     1
##      0           0      2      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        2   0            0         0     4
##      0           1      1      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      3      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           2      0      0        1   0            0         0     1
##      0           1      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      4      0        0   0            0         1     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        1   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     2
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           6      0      0        0   0            0         0     5
##      0           6      0      0        4   0            0         0     1
##      0           7      0      0        1   0            0         0     1
##      0           5      0      0       12   0            0         0     6
##      0           5      0      0        5   0            0         0     3
##      0           4      0      0        8   0            0         0     4
##      0           4      0      0        5   0            0         0     2
##      0           8      0      0        8   1            0         0    10
##      0          10      0      0       14   1            0         0     8
##      0           1      0      0        1   0            0         0     0
##      0          12      0      0        5   0            0         0     2
##      0           3      0      0        3   0            0         0     2
##      0           7      0      0        8   0            0         0     6
##      0           0      0      0        0   0            0         0     0
##      0           5      0      0        6   1            0         0     2
##      0           0      0      0        4   0            0         0     1
##      0          10      0      1        5   0            0         0     2
##      0           5      1      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0          10      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      3      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           2      3      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           5      0      0        2   0            0         0     3
##      0           1      0      0        2   0            0         0     1
##      0           1      0      0        1   0            0         0     0
##      0           1      0      0        2   0            0         0     1
##      0           2      0      0        2   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     4
##      0           0      0      0        0   0            0         0     3
##      1           0      0      0        0   0            0         0     4
##      0           0      0      0        0   0            0         1     0
##      0           0      3      0        7   1            0         7     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     2
##      0           1      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      3      2        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           9      1      0        0   0            0         0     4
##      0           6      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      1      4        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      3      0        3   0            0         2     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        1   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      2        1   0            0         0     0
##      0           0      0      0        0   0            0         1     2
##      1           0      0      3        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      2      0        0   0            0         0     0
##      0           1      0      0        0   0            0         1     0
##      0           2      2      0        1   0            0         0     0
##      0           0      2      0        0   0            0         1     0
##      0           4      2      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           3      3      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      2      0        0   0            0         0     1
##      0           4      1      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           2      1      0        0   0            0         0     0
##      0           1      1      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           2      0      1        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           5      5      3        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      1           0      0      0        1   0            0         0     0
##      0           1      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      1      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     2
##      0           0      1      0        5   0            0         1     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      3      0        1   0            0         0     0
##      0           1      0      1        0   0            0         0     1
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     5
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        2   0            0         0     1
##      0           0      0      1        2   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      3      2        2   0            0         0     5
##      1           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     2
##      0           0      0      1        4   0            0         0     3
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      2      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        0   0            0         0     0
##      0           1      1      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      1           0      2      0        3   0            0         0     2
##      0           2      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        5   0            0         0     1
##      0           0      2      0        0   0            0         0     1
##      0           1      3      0        0   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      1           0      2      0        1   0            0         0     1
##      0           6      3      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      3      0        1   0            0         0     3
##      0           4      0      1        1   0            0         0     3
##      0           9      0      0        0   0            0         0     0
##      0           7      0      0        0   0            0         0     1
##      0           7      0      0        0   0            0         0     2
##      0           2      1      0        0   1            0         0     3
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           8      0      0        0   0            0         0     0
##      0           7      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           7      1      0        2   0            0         1     2
##      0           8      2      0        1   0            0         0     1
##      0           4      4      0        4   0            0         1     8
##      0          10      3      0        1   0            0         1     3
##      0          13      5      0        7   0            0         1    11
##      0           7      3      0        1   0            0         0     6
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      1        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           1      0      1        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      5      3        2   0            0         0     4
##      0           0      3      1        0   0            0         1     0
##      0           0      2      2        0   0            0         1     0
##      0           0      2      1        0   0            0         0     0
##      0           1      4      5        0   0            0         1     1
##      0           1      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     1
##      0           2      1      0        0   0            0         1     7
##      0           0      0      0        0   0            0         0     3
##      0           1      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         1     4
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     1
##      0           0      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           3      1      0        0   0            0         0     1
##      0           3      3      0        0   0            0         0     1
##      0           4      1      1        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      2      0        0   1            0         1     8
##      0           1      1      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           1      0      0        1   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     2
##      0           2      0      0        0   0            0         0     3
##      0           1      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     3
##      0           1      0      0        0   0            0         0     3
##      0           3      1      0        0   0            0         0     1
##      0           1      0      0        1   0            0         1     5
##      0           3      0      0        0   0            0         1     0
##      0           1      0      0        0   0            0         2     0
##      0           3      0      0        0   0            0         1     3
##      0           2      0      0        0   0            0         4     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      1      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     2
##      0           4      0      1        0   0            0         0     1
##      0           4      1      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      1      0        3   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      2           0      0      1        0   0            0         0     1
##      1           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      3      0        1   0            0         0     2
##      0           2      0      0        0   0            0         0     0
##      0           0      1      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        4   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     2
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           1      1      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           3      0      0        1   0            0         0     3
##      0           0      0      0        0   1            0         0     3
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      2      1        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      0      0        1   0            0         1     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      0      0        0   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      1      0        0   0            0         0     0
##      0           1      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      1      1        3   1            0         0     3
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           2      1      0        1   0            0         0     5
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      2      0        0   1            0         0     3
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      6      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           3      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      1      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        3   0            0         0     0
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           3      0      1        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           6      0      0        0   1            0         0     3
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        3   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           3      1      0        1   0            0         0     5
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        8   0            0         0     1
##      0           2      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           1      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0          10      4      0        7   0            1         0     7
##      0           6      2      1        0   0            1         0    12
##      0          12      5      0        7   0            0         1     1
##      0           6      4      0        6   0            1         0     3
##      0           9      3      1       10   0            0         2     6
##      0          10      5      1        8   0            0         0     8
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        2   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      1      0        3   0            0         0     0
##      0           0      3      0        3   0            0         3     0
##      0           0      0      0        3   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         2     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        4   0            0         0     1
##      0           1      2      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        0   0            0         1     7
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     3
##      0           3      1      1        1   0            0         0     8
##      0           1      1      1        1   0            0         0     7
##      0           1      1      1        1   0            0         0     5
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      3          37     20      5       30   0            0         0    62
##      0           0      1      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      2        0   0            0         0     1
##      0           0      0      3        0   0            0         0     0
##      0           0      0      0        2   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   1            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           7      2      1        3   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           5      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           5      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        1   0            0         0     2
##      0           5      6      5        3   1            0         0     2
##      0           9      5      0        8   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      1      1        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      1      1        0   0            0         0     1
##      0           0      1      1        0   0            0         0     1
##      0           0      1      0        0   0            0         0     1
##      0           0      1      2        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      3      0        6   0            0         0     4
##      0           3      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        1   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        1   0            0         0     2
##      0           2      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      1           1      2      1        0   0            0         1     5
##      0           0      0      0        3   0            0         0     0
##      0           3      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           8      4      2        2   1            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           4      1      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   1            0         0     1
##      0           0      2      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     3
##      0           2      0      0        0   0            0         0     2
##      0           2      0      0        1   1            0         0     3
##      0           0      0      0        1   0            0         0     1
##      0           3      0      0        4   0            0         0     8
##      0          12      0      0       10   0            0         0     1
##      0           0      0      0        0   0            0         2     1
##      0           4      0      0        1   1            0         0     3
##      0           0      0      0        3   0            0         0     0
##      0           8      1      0        4   0            0         0     5
##      0           0      0      0        3   0            0         0     5
##      1           2      2      1        3   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           1      0      0        3   0            0         0     1
##      0           4      0      0        4   1            0         2     0
##      0           4      0      0        1   1            0         0     4
##      0           0      0      0        1   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           3      1      0        5   0            0         0     4
##      0           5      0      1        4   1            0         0     1
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        2   0            0         0     0
##      0           0      0      0        0   0            0         0     7
##      0           0      0      0        0   0            0         0     0
##      0           1      2      1        0   0            0         0     0
##      0           0      0      0        3   0            0         0     0
##      0           0      2      0        4   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        5   0            0         0     2
##      0           0      0      0        1   0            0         1     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      1      0        0   0            0         0     4
##      0           0      0      0        1   0            0         0     1
##      0           1      0      0        1   0            0         0     0
##      0           7      1      0        9   0            0         0     4
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           4      2      0        0   0            0         0     4
##      0           2      0      1        0   0            0         0     0
##      0          14      6      0        1   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           2      2      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           2      1      0        0   0            0         0     1
##      1           9     10      0        5   1            0         1    22
##      0           4      1      0        0   0            0         1     3
##      0           0      0      0        0   0            0         0     0
##      1           3      1      0        1   0            0         1     4
##      0           2      1      0        0   0            0         0     2
##      1           2      1      0        0   0            0         0     3
##      1           2      1      0        0   0            0         0     3
##      1           6      0      0        0   0            0         0     4
##      0           0      1      0        0   0            0         0     1
##      0           2      0      0        1   0            0         0     2
##      1           6      0      0        2   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         1     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     2
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           5      3      0        2   0            0         1     3
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      1      0        6   0            0         0     1
##      0           0      0      0        0   0            0         0     4
##      0           0      2      0        0   0            0         1     1
##      0           0      1      0        0   0            0         0     0
##      0           5      1      0        1   0            0         1     1
##      0           2      0      0        1   0            0         1     1
##      0           0      1      0        1   0            0         0     0
##      0           0      2      0       14   1            0         0     5
##      0           0      0      0        3   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           4      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     3
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     4
##      0           4      0      0        1   0            0         0     2
##      0           0      0      0        1   0            0         0     0
##      0           1      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           3      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           5      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     4
##      0           1      0      0        3   0            0         1     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        2   0            0         0     2
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        2   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      2      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           4      0      0        2   0            0         0     5
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      1           3      0      0        2   0            0         1    11
##      0           0      0      0        0   0            0         0     1
##      0           1      1      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        1   0            0         0     5
##      0           8      0      0        1   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0          17      0      0        0   0            0         0     3
##      0           2      0      0        0   0            0         0     1
##      0          25      3      0        0   0            0         0    12
##      0           0      1      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     1
##      0           0      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     2
##      0           0      3      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           2      0      0        7   0            0         0     1
##      0           0      0      0        0   0            0         0     4
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        0   0            0         1     1
##      1           0      0      0        1   0            0         0     4
##      0           3      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     2
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      3      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      1      0        3   0            0         0     0
##      0           1      0      0        3   0            0         0     0
##      0           1      1      0        3   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      1      0        2   0            0         0     0
##      0           1      1      0        0   0            0         0     0
##      0           5      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           4      0      2        1   0            0         0     3
##      0           1      0      0        0   0            0         0     2
##      0           0      0      0        4   0            0         0     3
##      0           1      0      0        7   0            0         1     0
##      0           3      3      1        3   0            0         0     3
##      0           2      0      0        4   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      1      1        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     1
##      0           3      0      0        1   0            0         0     0
##      0           3      0      0        0   0            0         0     1
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        1   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           3      1      0        0   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        4   0            0         0     4
##      0           2      0      0        0   0            0         0     0
##      0           3      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           2      1      0        0   0            0         0     2
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      1      0        1   0            0         0     1
##      0           4      1      2        5   0            0         1     4
##      0           0      0      0        0   0            0         0     0
##      0           6      4      0        0   0            0         0     2
##      0           3      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     0
##      0           4      0      0        0   0            0         0     3
##      0           0      0      0        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           1      0      0        0   0            0         0     0
##      0           0      0      1        0   0            0         0     0
##      0           0      0      2        0   0            0         0     0
##      1           3      0      0        0   0            0         0     0
##      1           0      0      0        0   0            0         0     2
##      0           3      0      0        1   0            0         0     1
##      0           0      0      0        0   0            0         0     1
##      0           0      1      0        0   0            0         0     0
##  Sweden Switzerland United Arab Emirates United Kingdom Unspecified USA
##       0           0                    0           1455           0   0
##       0           0                    0             47           0   0
##       0           0                    0              1           0   0
##       0           0                    0              7           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           3                    1            274           0   0
##       0           2                    0            155           0   0
##       0           0                    0             80           0   0
##       0           0                    0             88           0   0
##       0           0                    0             10           0   0
##       0           0                    0            145           0   0
##       0           0                    0            253           2   0
##       1           2                    0            341           1   0
##       1           0                    0            347           1   1
##       2           1                    0            349           0   0
##       0           1                    1            163           0   0
##       0           1                    0            254           3   0
##       0           1                    0            252           2   0
##       1           1                    0            220           2   0
##       0           0                    0             11           0   0
##       0           0                    0             20           0   0
##       0           1                    0            110           0   0
##       0           0                    0              7           0   0
##       0           1                    0            245           0   0
##       0           0                    0              1           0   0
##       0           2                    0             56           0   0
##       0           0                    0             37           1   0
##       0           0                    0             11           0   0
##       0           0                    0             34           0   0
##       0           0                    0             24           0   0
##       0           0                    0             24           0   0
##       0           0                    0            192           0   0
##       0           1                    0             53           0   0
##       0           1                    0            161           1   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              3           0   0
##       0           1                    0            198           0   0
##       0           1                    0             83           0   0
##       0           0                    0            310           0   0
##       0           0                    0            131           0   0
##       0           0                    0            367           0   0
##       1           2                    0            326           2   0
##       0           0                    0              6           0   0
##       1           0                    0            189           0   1
##       1           0                    0             96           0   0
##       0           1                    0            164           0   0
##       0           0                    0            448           4   0
##       0           1                    0            189           1   0
##       1           1                    0            144           1   0
##       0           0                    0             40           0   0
##       1           1                    0            206           0   1
##       0           0                    0              3           0   0
##       0           0                    0            120           0   0
##       0           0                    0              2           0   0
##       2           2                    0             76           0   1
##       1           0                    0            163           1   0
##       1           1                    0            174           0   0
##       1           1                    1            119           0   0
##       0           0                    0             20           0   0
##       0           0                    0            278           0   0
##       0           0                    0            256           0   0
##       0           2                    0            147           1   0
##       0           0                    0            139           0   0
##       0           0                    0             82           0   0
##       0           1                    0             46           0   0
##       0           0                    0             73           1   0
##       0           0                    0            111           2   0
##       0           0                    0            189           1   0
##       0           1                    0            181           1   0
##       0           0                    0             32           0   0
##       0           0                    0             14           0   0
##       0           0                    0              1           0   0
##       0           0                    0            137           0   0
##       0           2                    0            133           0   0
##       0           2                    0            103           0   0
##       1           1                    0            136           0   0
##       0           0                    0             33           0   0
##       0           0                    0             23           0   0
##       0           0                    0             40           0   0
##       0           0                    0             43           0   0
##       0           0                    0             61           0   0
##       0           0                    0            406           3   0
##       1           0                    0            164           0   0
##       0           0                    0             97           0   0
##       1           1                    0             22           0   0
##       0           5                    0             97           0   0
##       0           0                    0              6           0   0
##       0           0                    0              8           0   0
##       0           0                    0              6           0   0
##       0           0                    0             13           0   0
##       0           0                    0            118           0   0
##       0           0                    0             98           0   0
##       0           0                    0             24           0   0
##       0           1                    0            147           0   0
##       0           0                    0            140           0   0
##       1           0                    0            302           0   1
##       0           0                    0            295           0   1
##       0           2                    0            198           0   0
##       0           0                    1            218           1   0
##       1           5                    1            880           0   0
##       0           3                    0            192           0   0
##       0           0                    0            199           1   0
##       4           3                    0            387           1   1
##       4           0                    0            610           1   0
##       0           0                    0              2           0   0
##       2           1                    0            786           2   1
##       0           0                    0             36           0   0
##       0           0                    0             14           0   0
##       0           0                    0              1           0   0
##       1           0                    0            586           2   0
##       0           0                    0             18           0   0
##       0           0                    0             43           0   0
##       0           0                    0             73           0   0
##       0           0                    0             33           0   0
##       0           0                    0             10           0   0
##       0           0                    0              4           0   0
##       1           1                    0            188           0   0
##       0           0                    0             71           0   0
##       0           0                    0             45           0   0
##       0           0                    0             73           0   0
##       0           0                    0             19           0   0
##       0           0                    0             27           0   0
##       0           0                    0              6           0   0
##       0           0                    0              2           0   0
##       0           0                    0              3           0   0
##       0           0                    0             18           0   0
##       0           0                    0              4           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              3           0   0
##       0           0                    0             16           0   0
##       0           0                    0              2           0   0
##       0           2                    0             34           0   0
##       1           0                    0            218           1   0
##       0           0                    0             21           0   0
##       0           0                    0            342           0   0
##       0           0                    0            156           0   0
##       0           1                    0            202           0   0
##       0           0                    0            112           0   0
##       1           1                    0            384           0   0
##       0           0                    0            139           0   0
##       0           0                    1            290           0   0
##       0           0                    0              1           0   0
##       0           2                    0            388           0   0
##       0           4                    0            895           0   0
##       0           2                    0            533           0   0
##       0           2                    0            407           0   0
##       0           3                    0            666           0   0
##       0           2                    0            953           1   0
##       0           0                    0              1           0   0
##       0           1                    0             57           0   0
##       0           0                    0            183           0   0
##       0           0                    0              6           0   0
##       0           0                    0            128           1   0
##       0           0                    0              8           0   0
##       0           0                    0              7           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              8           0   0
##       0           0                    0             10           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           0                    0              8           0   0
##       0           0                    0              3           0   0
##       0           0                    0             12           0   0
##       0           0                    0             22           0   0
##       0           0                    0              5           0   0
##       0           0                    0              7           0   0
##       0           0                    0              7           0   0
##       0           0                    0             16           0   0
##       0           0                    0              5           0   0
##       0           0                    0             20           0   0
##       0           0                    0             11           0   0
##       0           0                    0             17           0   0
##       0           0                    0             14           0   0
##       0           0                    0             10           0   0
##       0           0                    0            167           0   0
##       0           1                    0             71           0   0
##       0           0                    0            134           0   0
##       0           0                    0             11           0   0
##       0           0                    0             43           0   0
##       0           0                    0             16           0   0
##       0           0                    0             49           0   0
##       0           0                    0             33           0   0
##       0           0                    0             21           0   0
##       0           0                    0             36           0   0
##       0           0                    0              7           0   0
##       0           0                    0              9           0   0
##       0           0                    0              5           0   0
##       0           0                    0              0           0   0
##       0           0                    0            103           0   0
##       0           0                    0            198           0   0
##       0           0                    0             34           0   0
##       0           0                    0             19           0   0
##       0           1                    0            261           0   0
##       0           0                    0             39           0   0
##       0           1                    0            215           0   0
##       0           0                    0              7           0   0
##       0           0                    0             69           0   0
##       0           0                    0             20           0   0
##       0           0                    0              2           0   0
##       0           0                    0              4           0   0
##       0           0                    0              5           0   0
##       0           0                    0              4           0   0
##       0           0                    0             82           0   0
##       0           0                    0              3           0   0
##       0           0                    0            683           0   0
##       0           0                    0            358           0   0
##       0           0                    0            221           0   0
##       0           1                    0            201           0   0
##       0           0                    0             18           0   0
##       0           1                    0            216           0   0
##       0           0                    0             67           0   0
##       0           0                    0             89           0   0
##       0           0                    0             12           0   0
##       0           0                    0            431           1   0
##       0           0                    0              4           0   0
##       0           0                    0             60           1   0
##       0           0                    0              7           0   0
##       0           0                    0              7           0   0
##       0           0                    0             10           0   0
##       0           0                    0             25           0   0
##       0           0                    0             17           0   0
##       0           0                    0            154           0   0
##       0           0                    0             41           0   0
##       2           5                    0            156           0   0
##       0           0                    0              8           0   0
##       0           0                    1             16           0   0
##       0           0                    0             37           0   0
##       0           5                    0           1405           3   0
##       0           0                    0             60           0   0
##       0           0                    0             28           0   0
##       0           4                    0            309           2   0
##       0           0                    0              1           0   0
##       0           0                    0             19           0   0
##       0           0                    0            118           0   0
##       0           0                    0              9           0   0
##       3           0                    0            496           0   0
##       0           0                    0            102           0   0
##       0           0                    0             21           0   0
##       0           4                    0             43           0   0
##       0           0                    0              9           0   0
##       0           0                    0            103           0   0
##       0           0                    0             26           0   0
##       0           0                    0             24           0   0
##       0           0                    0             26           1   0
##       0           0                    0             55           0   0
##       0           0                    0              5           1   0
##       0           0                    0             19           0   0
##       0           0                    0             83           0   0
##       0           1                    0            133           0   0
##       0           0                    0             34           0   0
##       0           0                    0             49           0   0
##       0           0                    0             30           0   0
##       0           2                    0             55           0   0
##       0           0                    0             40           0   0
##       0           0                    0            101           0   0
##       0           1                    0             63           0   0
##       0           0                    0             13           0   0
##       0           0                    0             34           0   0
##       0           0                    0              4           0   0
##       0           0                    0            104           2   0
##       0           0                    0             57           0   0
##       0           0                    0             85           0   0
##       0           0                    0              2           0   0
##       0           1                    0            142           0   0
##       0           0                    0             83           0   0
##       0           0                    0             22           0   0
##       0           0                    0            279           1   0
##       2           0                    0            226           1   0
##       0           0                    0            137           1   0
##       0           0                    0             14           0   0
##       0           0                    0              2           0   0
##       1           0                    0            138           0   0
##       0           0                    0              1           0   0
##       0           0                    0            114           0   0
##       0           0                    0             69           0   0
##       2           1                    0            178           0   0
##       1           0                    0            119           0   0
##       1           0                    0             59           0   0
##       1           0                    0             46           0   0
##       0           0                    0              1           0   0
##       1           0                    0             58           0   0
##       0           5                    0            802           2   1
##       0           3                    0            405           0   0
##       0           0                    0             98           0   0
##       0           3                    0            111           1   0
##       0           3                    0            149           0   0
##       0           2                    0            338           0   0
##       0           0                    0             36           0   0
##       0           0                    0             12           0   0
##       0           2                    0            152           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              4           0   0
##       0           0                    0              1           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0             62           0   0
##       0           1                    0            110           0   0
##       0           0                    0            266           0   0
##       0           0                    0             27           0   0
##       0           0                    0            688           0   0
##       0           0                    0             20           0   0
##       0           0                    0             20           0   0
##       0           0                    0             12           0   0
##       0           0                    0             11           0   0
##       0           0                    0             13           0   0
##       0           0                    0             21           0   0
##       0           0                    0              8           0   0
##       0           0                    0             27           0   0
##       0           0                    0             38           0   0
##       0           0                    0             46           0   0
##       0           0                    0             49           0   0
##       0           0                    0             15           0   0
##       0           0                    0             60           0   0
##       0           0                    0            172           0   0
##       0           0                    0             31           0   0
##       0           0                    0             63           0   0
##       0           0                    0            206           0   0
##       0           0                    0             66           0   0
##       0           0                    0              1           0   0
##       0           0                    0             10           0   0
##       0           0                    0            118           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           1                    0            205           0   0
##       0           0                    0              7           0   0
##       0           0                    1            428           0   0
##       0           0                    0            115           0   0
##       0           0                    0             37           0   0
##       0           0                    1            165           0   0
##       0           0                    0              1           0   0
##       0           0                    0              4           0   0
##       1           2                    0            345           3   0
##       0           0                    0              7           0   0
##       0           1                    0            133           0   0
##       0           1                    0            114           0   0
##       0           2                    0            272           0   0
##       0           0                    0              1           0   0
##       0           1                    0             63           0   0
##       0           0                    0            140           0   0
##       0           1                    0            133           0   0
##       0           1                    0             47           1   0
##       0           1                    0              0           0   0
##       0           0                    0             27           1   1
##       0           1                    0            255           0   0
##       0           0                    0             94           1   0
##       0           1                    0            280           0   0
##       0           1                    0            264           1   0
##       0           1                    0            112           0   0
##       0           0                    0              3           0   0
##       0           1                    0            136           0   0
##       0           0                    0            171           0   0
##       0           0                    0              8           0   0
##       0           0                    0             44           0   0
##       0           0                    0             50           1   0
##       0           0                    0             34           0   0
##       0           0                    0             35           0   0
##       0           0                    0             17           0   0
##       0           0                    0             82           0   0
##       0           0                    0             35           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           1                    0             22           0   0
##       0           1                    0             21           0   0
##       0           0                    0             17           0   0
##       0           0                    0              7           0   0
##       0           0                    0              9           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           1                    0             41           0   0
##       0           0                    0              3           0   0
##       0           0                    0             10           0   0
##       0           0                    0             29           0   0
##       0           0                    0             19           0   0
##       0           0                    0             71           0   0
##       0           0                    0              7           0   0
##       0           0                    0              6           0   0
##       0           0                    0              2           0   0
##       0           0                    0              4           0   0
##       0           0                    0              5           0   0
##       0           0                    0             27           0   0
##       0           0                    0              1           0   0
##       0           0                    0              7           0   0
##       0           0                    0            187           0   0
##       1           1                    0            164           0   0
##       1           0                    0             60           0   0
##       0           0                    0             28           0   0
##       0           0                    0              9           0   0
##       0           0                    0            112           0   0
##       0           0                    0             19           0   0
##       0           0                    0              3           0   0
##       0           0                    0            146           0   0
##       0           0                    0            361           0   0
##       0           1                    0              1           0   0
##       0           1                    0             17           0   0
##       0           0                    0             12           0   0
##       0           0                    0             28           0   0
##       0           0                    0             42           0   0
##       0           0                    0             47           0   0
##       0           0                    0            128           0   0
##       0           1                    0             44           0   0
##       0           0                    0              2           0   0
##       0           0                    0              6           0   0
##       0           0                    0              7           0   0
##       0           0                    0             31           0   0
##       0           0                    0             21           0   0
##       0           5                    0            245           0   0
##       0           0                    0              7           0   0
##       0           0                    0              9           0   0
##       0           0                    0              1           0   0
##       0           0                    0              3           0   0
##       0           0                    0             15           0   0
##       0           0                    0             29           1   0
##       0           0                    0            123           0   0
##       0           0                    0              1           0   0
##       0           0                    0             55           0   0
##       0           0                    0             26           0   0
##       0           0                    0              8           0   0
##       0           1                    0             38           0   0
##       0           2                    0             91           0   0
##       0           1                    0             54           0   0
##       0           1                    0             10           0   0
##       0           0                    0              3           0   0
##       0           0                    0              2           0   0
##       0           0                    0            118           0   0
##       0           0                    0             17           0   0
##       0           0                    0            108           0   0
##       0           0                    0              5           0   0
##       0           0                    0             12           0   0
##       0           0                    0             29           0   0
##       0           0                    0             25           0   0
##       0           0                    0              2           0   0
##       0           2                    0            130           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0             28           0   0
##       0           0                    0             11           0   0
##       0           0                    0              5           0   0
##       0           3                    0            322           0   0
##       0           0                    0             12           0   0
##       0           0                    0             45           0   0
##       0           1                    0            187           0   0
##       0           0                    0              1           0   0
##       0           0                    0              7           0   0
##       0           0                    0             93           0   0
##       0           1                    0             70           0   0
##       0           0                    0              2           0   0
##       0           0                    0             30           0   0
##       0           0                    0              2           0   0
##       0           0                    0              9           0   0
##       0           0                    0              5           0   0
##       0           0                    0             64           0   0
##       0           0                    0             22           0   0
##       0           0                    0            176           0   0
##       0           0                    0              1           0   0
##       0           0                    0              6           0   0
##       0           0                    0             57           0   0
##       0           0                    0             22           0   0
##       0           0                    0              5           0   0
##       1           6                    0            338           1   1
##       0           4                    0            523           1   0
##       0           0                    0             17           0   0
##       0           0                    0              7           0   0
##       0           0                    0             39           0   0
##       0           0                    0             23           0   0
##       0           0                    0             48           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0             14           0   0
##       0           0                    0             11           0   0
##       0           0                    0              7           0   0
##       0           1                    0             31           0   0
##       0           0                    0              1           0   0
##       0           0                    0              4           0   0
##       0           0                    0             93           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0             73           0   0
##       0           0                    0             24           0   0
##       0           0                    0             58           0   0
##       0           0                    0             60           0   0
##       0           0                    1             87           0   0
##       0           0                    0             57           0   0
##       0           0                    0            103           1   0
##       0           0                    0             42           0   0
##       0           2                    0             78           0   0
##       0           6                    0            278           0   1
##       0           0                    0             67           0   0
##       0           2                    0            271           0   1
##       0           0                    0             62           0   0
##       1           1                    0             80           0   0
##       0           1                    0             70           0   0
##       0           0                    0             77           0   0
##       0           0                    0             94           0   0
##       0           3                    0            158           0   0
##       0           0                    0              8           0   0
##       0           0                    0             33           0   0
##       0           0                    0            139           0   0
##       1           3                    0            186           1   1
##       0           1                    0             65           0   0
##       0           0                    0             78           0   0
##       0           2                    0             70           0   0
##       0           0                    0             14           0   0
##       0           1                    0             83           0   0
##       0           0                    0              8           0   0
##       0           0                    0             18           0   0
##       0           1                    0            121           0   0
##       0           0                    0             30           1   0
##       0           0                    0             46           0   0
##       0           0                    0              2           0   0
##       0           1                    0            352           0   0
##       0           0                    0              8           0   0
##       0           0                    0             19           0   0
##       0           3                    0            401           0   1
##       0           0                    0              3           0   0
##       0           0                    0             27           0   0
##       0           0                    0             10           0   0
##       0           0                    0             46           0   0
##       0           0                    0              2           0   0
##       0           0                    0              4           0   0
##       0           0                    0             12           0   0
##       0           0                    0             39           0   0
##       0           0                    0             99           0   0
##       1           3                    0            182           0   0
##       0           0                    0              5           0   0
##       0           0                    0              6           0   0
##       0           0                    0             98           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0             12           0   0
##       0           0                    0            209           0   0
##       0           0                    0            100           1   0
##       0           0                    0             91           2   0
##       0           0                    0             53           0   0
##       0           1                    0             76           0   0
##       0           0                    0             79           0   0
##       0           0                    0             18           0   0
##       0           1                    0              6           0   0
##       0           0                    0             53           0   0
##       0           0                    0             26           0   0
##       0           0                    0             22           0   0
##       1           1                    0            192           0   0
##       0           2                    0            171           0   0
##       0           1                    0            567           0   0
##       0           0                    0            202           0   0
##       1           1                    0            194           0   0
##       1           1                    1            377           1   0
##       1           1                    1            355           2   0
##       0           0                    0            103           1   0
##       0           2                    0            237           0   0
##       0           2                    0            207           0   0
##       0           0                    0             40           0   0
##       0           0                    0              4           0   0
##       0           0                    0             97           0   0
##       0           0                    0             11           0   0
##       1           1                    0            230           0   0
##       0           3                    0            299           0   0
##       0           0                    0            101           0   0
##       0           0                    0             98           0   1
##       0           3                    0            214           1   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           2                    0             99           0   0
##       0           1                    0            236           0   0
##       0           0                    0             52           0   0
##       0           0                    0             69           0   0
##       0           0                    0              1           0   0
##       0           0                    0            148           0   0
##       0           0                    0            134           0   0
##       0           0                    0              7           0   0
##       0           0                    0              2           0   0
##       3           1                    0            228           1   0
##       1           1                    0            167           0   0
##       0           0                    0             15           0   0
##       0           2                    0            250           0   0
##       0           1                    0             78           0   0
##       0           0                    0            306           1   0
##       0           0                    0              5           0   0
##       3           0                    0            260           0   0
##       0           0                    0            177           0   0
##       0           0                    0            117           0   0
##       0           0                    0             26           0   0
##       0           0                    0             78           0   0
##       0           0                    0            139           0   0
##       0           0                    0             97           0   0
##       0           0                    0              7           0   0
##       0           3                    0            101           0   0
##       0           0                    0             65           0   0
##       0           0                    0              2           0   0
##       0           0                    0             20           0   0
##       0           1                    0            245           1   0
##       0           0                    0              7           0   0
##       0           0                    0             27           0   0
##       0           1                    0             46           0   0
##       0           1                    0            139           1   0
##       0           0                    0             64           0   0
##       0           1                    0            205           0   0
##       0           0                    0              8           0   0
##       0           1                    0             62           0   0
##       0           0                    0              1           0   0
##       0           0                    0             31           0   0
##       0           0                    0             76           0   0
##       0           0                    0             33           0   0
##       0           0                    0            128           0   0
##       0           2                    0            116           0   0
##       0           1                    0             68           0   0
##       0           0                    0             81           0   0
##       0           0                    0             47           0   0
##       0           0                    0              1           0   0
##       0           1                    0             57           0   0
##       0           1                    0            107           0   0
##       0           1                    0            252           1   0
##       0           0                    0              1           0   0
##       0           0                    0             36           0   0
##       0           0                    0              1           0   0
##       0           0                    0             27           0   0
##       0           0                    0            157           1   0
##       0           1                    0             50           0   0
##       0           0                    0              1           0   0
##       0           0                    0             18           0   0
##       0           0                    0             53           0   0
##       0           1                    0            384           0   0
##       0           0                    0             59           0   0
##       0           1                    0             32           0   0
##       0           0                    0              6           0   0
##       0           0                    0            123           0   0
##       0           0                    0             85           0   0
##       0           0                    0             87           0   0
##       0           0                    0             47           0   0
##       0           0                    0             50           0   0
##       0           0                    0              2           0   0
##       0           0                    0              2           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       1           2                    0            153           0   0
##       0           2                    0            423           0   1
##       0           2                    0            204           0   0
##       0           1                    0            163           0   0
##       0           0                    0            228           0   1
##       0           5                    0            236           0   0
##       0           1                    0            127           0   0
##       0           1                    0            267           0   2
##       0           1                    0            135           0   0
##       0           1                    0            170           0   0
##       0           0                    0             79           0   0
##       0           0                    0             65           0   0
##       0           1                    0            218           0   0
##       0           1                    0            253           0   0
##       0           2                    0            217           0   0
##       0           1                    0            252           1   0
##       0           1                    0            279           0   0
##       0           0                    0            114           0   0
##       0           0                    0             82           0   0
##       0           1                    0             78           0   0
##       0           0                    0            130           0   0
##       0           0                    0             26           0   0
##       0           1                    0             48           0   0
##       0           0                    0             13           0   0
##       0           0                    0             30           0   0
##       0           0                    0            124           0   0
##       0           0                    0             59           0   0
##       0           0                    0             23           0   0
##       0           0                    0             24           0   0
##       0           0                    0              4           0   0
##       0           0                    0            109           1   0
##       0           0                    0              1           0   0
##       0           0                    0              8           0   0
##       0           0                    0              7           0   0
##       0           0                    0             21           0   0
##       0           0                    0             80           0   0
##       0           1                    0            115           0   0
##       0           0                    0            119           0   0
##       0           2                    0            166           0   1
##       0           1                    0             94           0   0
##       0           2                    0            134           0   0
##       0           0                    0            258           0   0
##       0           0                    0            347           0   0
##       0           0                    0             43           0   0
##       0           1                    0            134           0   0
##       0           1                    0             53           0   0
##       0           0                    0            366           0   0
##       0           1                    0            164           0   0
##       0           1                    0            106           0   0
##       0           1                    0             63           0   0
##       0           0                    0              7           0   0
##       0           0                    0             24           0   0
##       0           0                    0              2           0   0
##       0           0                    0             81           0   0
##       0           0                    0            107           0   0
##       0           0                    0            117           0   0
##       0           0                    0            254           0   0
##       0           0                    0             27           0   0
##       0           0                    0            206           0   0
##       0           0                    0             81           0   0
##       0           0                    0            144           0   0
##       0           0                    0             86           0   0
##       0           0                    0            308           0   0
##       0           0                    0            162           0   0
##       0           0                    0            104           0   0
##       0           0                    0             21           0   0
##       1           3                    0            498           0   0
##       0           2                    0            350           0   0
##       1           0                    0            691           0   0
##       0           0                    0            821           0   0
##       0           1                    0            411           0   0
##       0           0                    0            159           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           1                    0            102           0   0
##       0           0                    0              6           0   0
##       0           0                    0             60           0   0
##       0           0                    0             32           0   0
##       0           0                    0             71           0   0
##       0           0                    0             16           0   0
##       0           0                    0              3           0   0
##       0           0                    0             95           0   0
##       0           0                    0             66           0   0
##       0           0                    0             83           0   0
##       0           0                    0             22           0   0
##       0           0                    0             11           0   0
##       0           0                    0             78           0   0
##       0           0                    0            396           0   0
##       0           0                    0            258           1   0
##       0           1                    0            114           0   0
##       0           3                    0            193           0   1
##       0           3                    0            311           0   0
##       0           5                    0            478           1   0
##       2           5                    0             98           1   1
##       2           6                    0            203           3   1
##       0           2                    0            246           1   1
##       0           4                    0            215           0   1
##       3           5                    0            349           1   1
##       0           5                    0            274           0   1
##       0          11                    0            264           2   1
##       0           0                    0            188           0   1
##       0           0                    0             77           0   0
##       0           0                    0             70           0   0
##       0           0                    0              2           0   0
##       1           0                    0            156           0   0
##       0           3                    0            142           0   0
##       0           1                    0            147           0   0
##       0           3                    0            173           0   0
##       0           0                    0             79           0   0
##       0           0                    0             85           0   0
##       0           0                    0            126           0   0
##       0           0                    0            131           0   0
##       0           0                    0             58           0   0
##       0           0                    0             67           0   0
##       0           0                    0             98           0   0
##       0           0                    0             81           0   0
##       0           0                    0            110           0   0
##       0           0                    0            104           0   0
##       0           0                    0            662           0   0
##       0           1                    0             95           0   0
##       0           1                    0             66           0   0
##       0           1                    0             50           0   0
##       0           1                    0             70           0   0
##       0           5                    0            293           0   0
##       0           1                    1            190           0   0
##       0           2                    1            843           1   0
##       0           0                    1            452           1   0
##       0           0                    0             59           0   0
##       0           0                    0             39           0   0
##       0           0                    0             31           0   0
##       0           0                    0              0           0   0
##       0           1                    0            520           0   0
##       0           0                    0            441           0   0
##       0           0                    0            370           0   0
##       0           0                    0             74           0   0
##       0           0                    0             48           0   0
##       0           0                    0             52           0   0
##       0           0                    0            185           0   0
##       0           0                    0            182           0   0
##       0           0                    0             29           0   0
##       0           0                    0             44           0   0
##       0           0                    0            265           0   0
##       0           0                    0            120           0   0
##       0           3                    0            290           0   0
##       0           2                    0            145           0   0
##       0           1                    0            201           0   0
##       1           1                    0            102           0   0
##       0           1                    0            159           0   0
##       0           0                    0             10           0   0
##       0           0                    0            123           0   0
##       0           0                    0             96           0   0
##       0           0                    0            246           0   0
##       0           0                    0            179           0   0
##       0           0                    0             27           0   0
##       0           3                    0            183           0   0
##       0           1                    0            168           0   0
##       0           1                    0            259           0   0
##       0           0                    0              1           0   0
##       0           0                    0             97           0   0
##       0           1                    0            262           0   0
##       0           0                    0            125           0   0
##       0           0                    0             72           0   0
##       0           1                    0             90           0   0
##       0           0                    0            182           0   0
##       0           2                    0             77           0   0
##       0           0                    0            200           0   0
##       0           0                    0              9           0   0
##       0           0                    0             39           0   0
##       0           0                    0             77           0   0
##       0           0                    0             20           0   0
##       0           0                    0             60           0   0
##       0           0                    0              4           0   0
##       0           0                    0             23           0   0
##       0           0                    0             33           0   0
##       0           0                    0            151           0   0
##       0           0                    0             20           0   0
##       1           0                    0             35           0   0
##       0           2                    0             79           0   0
##       0           0                    0            115           0   0
##       0           3                    0            310           1   0
##       0           0                    0            158           0   0
##       0           2                    0            225           0   0
##       0           0                    0             14           0   0
##       0           0                    0              4           0   0
##       0           0                    0             47           0   0
##       0           0                    0            101           0   0
##       0           1                    0            308           0   0
##       0           0                    0            182           0   0
##       0           0                    0              1           0   0
##       0           0                    0              8           0   0
##       0           0                    0              2           0   0
##       0           0                    0             75           0   0
##       0           0                    0             72           0   0
##       0           0                    0            104           0   0
##       0           1                    0            283           0   0
##       0           0                    0             13           0   0
##       0           0                    0            271           0   0
##       0           0                    0             12           0   0
##       0           0                    0             16           0   0
##       0           0                    0             10           0   0
##       0           0                    0             10           0   0
##       0           0                    0              2           0   0
##       0           0                    0              7           0   0
##       0           0                    0             10           0   0
##       0           0                    0            434           0   0
##       0           0                    0             25           0   0
##       0           0                    0              5           0   0
##       0           0                    0             17           0   0
##       0           1                    0             41           0   0
##       0           4                    0            696           0   0
##       0           0                    0             68           0   0
##       0           0                    0             91           0   0
##       0           0                    0              1           0   0
##       0           3                    0            191           0   0
##       0           0                    0             58           0   0
##       0           1                    0            240           0   1
##       0           1                    0            190           0   0
##       0           1                    0            169           0   0
##       0           0                    0             44           0   0
##       0           0                    0             61           0   0
##       0           1                    0            603           0   0
##       0           0                    0            259           0   0
##       0           0                    0             54           0   0
##       0           0                    0             12           0   0
##       0           1                    0            365           0   0
##       0           0                    0             10           0   0
##       0           0                    0             34           0   0
##       0           0                    0             93           0   0
##       0           0                    0             11           0   0
##       0           0                    0             26           0   0
##       0           0                    0              3           0   0
##       0           0                    1            699           0   0
##       0           0                    0             27           0   0
##       0           0                    0              2           0   0
##       0           0                    0             14           0   0
##       0           0                    0             15           0   0
##       0           0                    0              1           0   0
##       0           0                    0             37           0   0
##       0           0                    0             90           0   0
##       0           0                    0            150           3   0
##       0           0                    0             29           0   0
##       0           0                    0             39           0   0
##       0           0                    0             23           0   0
##       0           0                    0            106           0   0
##       0           0                    0              5           0   0
##       0           1                    0            144           0   1
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           1                    0            241           0   0
##       0           0                    0              1           0   0
##       0           0                    0              5           0   0
##       0           0                    0              4           0   0
##       0           0                    0              9           0   0
##       0           0                    0              2           0   0
##       0           0                    0              4           0   0
##       0           0                    0              7           0   0
##       0           0                    0            147           0   0
##       0           0                    0              5           0   0
##       0           0                    0              3           0   0
##       0           0                    0              4           0   0
##       0           0                    0            271           0   0
##       0           0                    0              8           0   0
##       0           2                    0            107           0   0
##       0           0                    0              9           0   0
##       0           1                    0            511           0   0
##       0           0                    0             50           0   0
##       0           0                    0             94           0   0
##       0           0                    0            156           0   0
##       0           0                    0             31           0   0
##       0           0                    0            503           0   0
##       0           0                    0              5           0   0
##       0           2                    0            151           0   0
##       0           0                    0              4           1   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0             20           0   0
##       0           0                    0              6           1   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           0                    0             11           0   0
##       0           0                    0             32           0   0
##       0           0                    0             28           0   0
##       0           0                    0             15           0   0
##       0           0                    0             15           0   0
##       0           0                    0             24           0   0
##       0           0                    0             10           0   0
##       0           0                    0             15           0   0
##       0           0                    0              7           0   0
##       0           0                    0             21           0   0
##       0           0                    0             32           0   0
##       0           0                    0             49           0   0
##       0           0                    0            102           0   0
##       3           1                    0            170           0   1
##       0           1                    0             38           0   0
##       0           0                    0              4           0   0
##       0           0                    0             17           0   0
##       0           0                    0             10           0   0
##       0           0                    0            136           0   0
##       0           0                    0              1           0   0
##       0           0                    0             41           0   0
##       0           0                    0             21           0   0
##       0           0                    0             31           0   0
##       0           0                    0              2           0   0
##       0           1                    0             60           0   0
##       0           0                    0              2           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0            157           0   0
##       0           0                    0             79           0   0
##       0           0                    0            100           0   0
##       0           0                    0            109           0   0
##       0           0                    0             82           0   0
##       0           0                    0             17           0   0
##       0           0                    0             97           0   0
##       0           0                    0             35           0   0
##       0           0                    0             10           0   0
##       0           0                    0             31           0   0
##       0           0                    0             65           0   0
##       0           0                    0             26           0   0
##       0           0                    0             43           0   0
##       0           0                    0             14           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0             45           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              5           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           0                    0             42           0   0
##       0           0                    0             33           1   0
##       0           0                    0             24           0   0
##       0           0                    0             92           0   0
##       0           1                    0             50           0   0
##       0           0                    0             25           0   0
##       0           0                    0              2           0   0
##       0           0                    0            138           0   0
##       0           0                    0            148           0   0
##       0           0                    0            111           0   0
##       0           0                    0             36           0   0
##       0           0                    0             51           0   0
##       0           0                    0              6           0   0
##       0           0                    0             82           0   0
##       0           0                    0            155           0   0
##       0           0                    0             42           0   0
##       0           0                    0             63           0   0
##       0           0                    0            179           0   0
##       0           0                    0            137           0   0
##       0           0                    0              5           0   0
##       0           0                    0             28           0   0
##       0           0                    0            163           0   0
##       0           0                    0             21           0   0
##       0           0                    0            256           0   0
##       0           0                    0            225           0   0
##       0           0                    0            113           0   0
##       0           0                    0             29           0   0
##       0           0                    0              5           0   0
##       0           0                    0            301           0   0
##       0           2                    0             57           0   0
##       0           0                    0              6           0   0
##       0           0                    0             18           0   0
##       0           0                    0             12           0   0
##       0           0                    0              9           0   0
##       0           0                    0             26           0   0
##       0           0                    0             13           0   0
##       0           0                    0              9           0   0
##       0           0                    0             18           0   0
##       0           0                    0             14           0   0
##       0           0                    0            147           0   0
##       0           0                    0              2           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              4           0   0
##       0           0                    0             20           0   0
##       0           0                    0              8           0   0
##       0           0                    0              1           0   0
##       0           1                    0             30           0   0
##       0           2                    0            162           0   0
##       0           2                    0            180           0   0
##       1           1                    0             84           0   0
##       0           2                    0            282           1   0
##       0           0                    0            216           0   0
##       0           0                    0            103           0   0
##       0           0                    0              1           0   0
##       0           0                    0            133           0   0
##       0           0                    0             61           1   0
##       0           0                    0              4           0   0
##       0           0                    0            126           0   0
##       0           2                    0            113           0   0
##       0           0                    0             27           0   0
##       0           0                    0             82           0   0
##       0           0                    0             29           0   0
##       0           0                    0             10           0   0
##       2           0                    0             95           0   0
##       0           0                    0             56           0   0
##       0           0                    0             11           0   0
##       0           0                    0              8           0   0
##       0           0                    0              7           0   0
##       0           0                    0             12           0   0
##       0           0                    0             18           0   0
##       0           0                    0             26           0   0
##       0           4                    1             91           1   0
##       0           0                    0            146           0   0
##       0           1                    0            139           0   1
##       0           1                    0            143           0   1
##       0           0                    0            126           0   0
##       0           3                    1            720           0   0
##       0           1                    0            130           0   0
##       0           0                    0              1           0   0
##       0           0                    0             11           0   0
##       0           0                    0             21           0   0
##       0           1                    0             70           0   0
##       0           0                    0              1           0   0
##       0           0                    0              4           0   0
##       0           0                    0             62           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           2                    0            227           0   0
##       0           3                    0            194           0   0
##       0           1                    0            193           0   0
##       0           1                    0             47           0   0
##       0           3                    0            377           0   0
##       0           2                    0            338           0   1
##       0           1                    0            463           0   0
##       0           0                    0             17           0   0
##       0           3                    0            568           0   0
##       0           1                    0            256           0   0
##       0           0                    0             96           0   0
##       0           2                    0            702           1   0
##       0           0                    0            136           0   0
##       0           2                    0            193           1   0
##       0           0                    0             92           0   0
##       0           3                    0            568           0   0
##       0           0                    0             25           0   0
##       0           9                    0            627           1   0
##       0           1                    0            160           0   0
##       0           6                    0            433           0   1
##       0           2                    0            183           0   0
##       0           2                    1            583           0   0
##       0           0                    0            200           0   0
##       0           0                    0            131           0   0
##       0           0                    0             86           0   0
##       0           1                    0            258           0   0
##       0           1                    0            115           1   0
##       0           4                    0            397           0   0
##       0           0                    0             65           0   0
##       0           0                    0             37           0   0
##       0           1                    0            287           0   0
##       0           0                    0              6           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0            708           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              8           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           0                    0              7           0   0
##       0           0                    0              3           0   0
##       0           0                    0              4           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              4           0   0
##       0           3                    0            308           0   1
##       0           1                    0             77           0   0
##       0           0                    0              2           0   0
##       0           0                    0             39           0   0
##       0           0                    0             83           0   0
##       0           0                    0            172           0   0
##       0           0                    0             66           0   0
##       0           1                    0            121           0   0
##       0           1                    0            137           0   0
##       0           1                    0            186           0   0
##       0           1                    0            138           0   0
##       0           0                    0             48           0   0
##       0           0                    0             27           0   0
##       0           0                    0             57           0   0
##       0           0                    0              7           0   0
##       0           0                    0             13           0   0
##       0           0                    0              8           0   0
##       0           0                    0             12           0   0
##       0           0                    0              8           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0             81           0   0
##       0           0                    0             23           0   0
##       0           0                    0             21           0   0
##       0           0                    0              8           0   0
##       0           1                    0            180           0   0
##       0           0                    0              1           0   0
##       0           0                    0             80           0   0
##       0           0                    0             97           0   0
##       0           0                    0             71           0   0
##       0           0                    0             75           0   0
##       0           0                    0             34           0   0
##       0           1                    0            127           0   0
##       0           0                    0             41           0   0
##       0           1                    0             99           0   0
##       0           3                    0            118           0   0
##       0           0                    0             59           0   0
##       1           0                    0             44           0   0
##       0           0                    0             39           0   0
##       0           0                    0             23           0   0
##       0           0                    0             11           0   0
##       0           0                    0              5           0   0
##       0           0                    0             17           0   0
##       0           0                    0             65           0   0
##       0           0                    0             19           0   0
##       0           0                    0             43           0   0
##       0           2                    0            321           0   0
##       0           0                    0            494           0   0
##       0           1                    0            140           0   0
##       0           1                    0            274           2   0
##       0           0                    0             31           0   0
##       0           0                    0             46           0   0
##       0           0                    0             37           0   0
##       0           1                    0             76           0   0
##       0           0                    0             58           0   0
##       0           0                    0             70           0   0
##       0           0                    0            117           0   0
##       0           0                    0             73           2   0
##       0           0                    0             93           1   0
##       0           0                    0             66           0   0
##       0           0                    0             83           1   0
##       0           0                    0            105           1   0
##       0           0                    0              3           0   0
##       0           0                    0             37           0   0
##       0           0                    0             83           0   0
##       0           2                    0             89           0   1
##       0           0                    0             45           0   0
##       0           0                    0              4           0   0
##       0           1                    0            145           0   0
##       0           0                    0              8           0   0
##       0           0                    0            207           0   0
##       0           0                    0             47           0   0
##       0           1                    0             18           0   0
##       0           2                    0             55           0   1
##       0           1                    0             86           0   0
##       0           1                    0             37           0   1
##       0           1                    0             53           0   0
##       0           1                    0             43           0   1
##       0           1                    0             29           0   0
##       0           2                    0             60           0   1
##       0           1                    0             38           0   1
##       0           1                    0             57           0   2
##       0           5                    0            221           0   0
##       0           1                    0            143           0   0
##       0           0                    0             26           0   0
##       0           0                    0            105           1   0
##       0           0                    0            168           0   0
##       0           1                    0            121           0   0
##       0           1                    0             36           0   0
##       0           0                    0             19           0   0
##       0           0                    0              3           0   0
##       0           0                    0              2           0   0
##       0           0                    0            438           0   0
##       0           0                    0            157           0   0
##       0           0                    0              1           0   0
##       0           0                    0            115           0   0
##       0           2                    0            483           0   0
##       0           0                    0              2           0   0
##       0           0                    0            373           0   0
##       0           0                    0              1           0   0
##       0           1                    0             57           0   0
##       0           0                    0             62           0   0
##       0           2                    0            201           0   0
##       0           2                    0            188           0   0
##       0           2                    0            234           0   0
##       0           0                    0             48           0   0
##       0           0                    0            208           0   0
##       0           2                    0            365           0   0
##       0           0                    0             11           0   0
##       0           0                    0             21           0   0
##       0           1                    0            331           0   0
##       0           0                    0            112           1   0
##       0           0                    0              2           0   0
##       0           0                    0             46           0   0
##       0           0                    0            110           0   0
##       0           2                    0            143           0   0
##       0           0                    0             12           0   0
##       0           0                    0              9           0   0
##       0           1                    0             29           0   0
##       0           0                    0             68           0   0
##       0           0                    0              1           0   0
##       0           0                    0             74           0   0
##       0           4                    0             59           0   1
##       0           1                    0            118           0   0
##       2           0                    0            239           2   0
##       0           0                    0             12           0   0
##       0           0                    0            143           0   0
##       0           0                    0            171           0   0
##       0           0                    0            101           0   0
##       0           0                    0             71           0   0
##       0           0                    0            102           0   0
##       1           0                    0             75           0   0
##       0           0                    0            345           0   0
##       0           0                    0            248           0   0
##       0           0                    0             13           0   0
##       0           3                    0            307           0   0
##       0           1                    0            221           1   0
##       0           0                    0            142           0   0
##       0           0                    0              1           0   0
##       0           0                    0             49           0   0
##       0           1                    0             15           0   0
##       0           4                    0            421           0   0
##       0           0                    0              1           0   0
##       0           0                    0            168           0   0
##       1           0                    0            228           0   0
##       1           0                    0            135           0   0
##       0           0                    0            101           1   0
##       0           0                    0            134           1   0
##       0           0                    0             53           0   0
##       0           1                    0            111           0   0
##       0           0                    0             52           0   0
##       0           0                    0             45           0   0
##       0           0                    0             74           0   0
##       0           0                    0             42           0   0
##       1           0                    0             94           0   0
##       1           1                    0             65           0   0
##       0           1                    0             52           0   0
##       0           0                    0            529           1   1
##       0           0                    0            121           1   0
##       0           1                    0            478           0   1
##       0           0                    0            300           0   0
##       0           0                    0            336           0   0
##       0           0                    0            458           0   0
##       0           1                    0            377           1   0
##       0           1                    0            252           0   0
##       0           0                    0             41           0   0
##       0           2                    0            303           0   0
##       1           3                    0            273           0   0
##       0           0                    0            259           1   0
##       0           0                    0            171           2   0
##       0           0                    0            158           0   0
##       0           0                    0            153           0   0
##       0           0                    0            161           0   0
##       0           0                    0            144           0   0
##       1           1                    0            432           0   0
##       0           0                    0            382           1   0
##       0           0                    0            265           0   0
##       0           0                    0             62           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           0                    0            123           0   0
##       0           0                    0            114           0   0
##       0           0                    0             93           0   0
##       0           0                    0            214           0   0
##       0           0                    0              7           0   0
##       0           0                    0            237           0   0
##       0           0                    0              6           0   0
##       0           0                    0              9           0   0
##       0           0                    0              6           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0              6           0   0
##       2           0                    0            153           1   0
##       0           1                    0             19           0   0
##       0           0                    0             47           0   0
##       0           0                    0             41           0   0
##       0           2                    0             75           1   0
##       0           2                    0            129           0   0
##       0           0                    0              7           0   0
##       0           0                    0              2           0   0
##       0           0                    0              7           0   0
##       0           0                    0              8           0   0
##       0           0                    0             32           0   0
##       0           0                    0             13           0   0
##       0           0                    0             12           0   0
##       0           0                    0              4           0   0
##       0           1                    0            415           0   0
##       0           0                    0             15           0   0
##       0           0                    0             27           0   0
##       0           0                    0              9           0   0
##       0           0                    0              9           0   0
##       0           0                    0             19           0   0
##       0           0                    0              1           0   0
##       0           0                    0              5           0   0
##       0           0                    0             24           0   0
##       0           0                    0              4           0   0
##       0           0                    0              5           0   0
##       0           0                    0              5           0   0
##       0           0                    0              2           0   0
##       0           0                    0             10           0   0
##       0           0                    0              5           0   0
##       0           0                    0              3           0   0
##       0           0                    0              4           0   0
##       0           0                    0              1           0   0
##       0           0                    0            129           0   0
##       0           1                    0             58           0   0
##       0           0                    0             39           0   0
##       0           0                    0              3           0   0
##       0           0                    0             39           0   0
##       0           0                    0             13           0   0
##       0           0                    0            205           0   0
##       0           0                    0             43           0   0
##       0           1                    0            136           0   0
##       0           0                    0            127           0   0
##       0           1                    0             82           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              2           0   0
##       0           0                    0              2           0   0
##       0           0                    0              2           0   0
##       0           1                    0             67           0   0
##       0           2                    0             52           0   0
##       0           0                    0             61           0   0
##       0           0                    0             38           0   0
##       0           1                    0            102           0   0
##       0           0                    0             35           0   0
##       0           0                    0             10           0   0
##       0           0                    0             16           1   0
##       0           0                    0             64           0   0
##       0           0                    0             64           0   0
##       0           0                    0              2           0   0
##       0           0                    0            100           0   0
##       0           0                    0             67           0   0
##       0           0                    0            125           0   0
##       0           0                    0            236           0   0
##       0           0                    0              2           0   0
##       0           0                    0            276           0   0
##       0           0                    0              1           0   0
##       0           1                    0            129           0   0
##       0           1                    0             33           1   0
##       0           0                    0            202           0   0
##       0           0                    0              1           0   0
##       0           0                    0             33           0   0
##       0           0                    0             25           0   0
##       0           0                    0              8           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           2                    0            391           0   0
##       0           0                    0             15           0   0
##       0           0                    0             76           0   0
##       0           0                    0             18           0   0
##       0           1                    0            215           0   0
##       0           0                    0            103           0   0
##       0           0                    0            210           0   0
##       0           0                    0            193           0   0
##       0           0                    0            167           0   0
##       0           0                    0            159           0   0
##       0           0                    0            161           0   0
##       0           0                    0            133           0   0
##       0           0                    0            119           0   0
##       0           0                    0            126           0   0
##       0           0                    0            105           0   0
##       0           0                    0            163           0   0
##       0           0                    0             55           0   0
##       0           0                    0              4           0   0
##       0           0                    0             17           0   0
##       0           0                    0              6           0   0
##       0           0                    0              8           0   0
##       0           2                    0            294           0   0
##       0           3                    0            103           0   0
##       0           0                    0             14           0   0
##       0           0                    0            121           0   0
##       0           0                    0             84           0   0
##       0           0                    0            130           0   0
##       0           1                    0            159           0   0
##       0           0                    0             62           0   0
##       0           0                    0            142           0   0
##       0           1                    0            107           0   0
##       0           0                    0            113           0   0
##       0           0                    0             17           0   0
##       0           0                    0             66           0   0
##       0           0                    0             60           0   0
##       0           0                    0             31           0   0
##       0           2                    0            182           0   0
##       0           2                    0            287           0   0
##       0           0                    0              2           0   0
##       0           0                    0              5           0   0
##       0           2                    0             79           2   0
##       0           1                    0             64           0   0
##       0           0                    0             78           0   1
##       0           0                    0             20           0   0
##       0           0                    0              2           0   0
##       0           0                    0              8           0   0
##       0           0                    0             22           0   0
##       0           0                    0             45           0   0
##       0           0                    0             23           0   0
##       0           0                    0             83           0   0
##       0           0                    1            124           0   0
##       0           0                    0            146           0   1
##       0           0                    1            200           0   0
##       0           1                    0            292           0   0
##       0           0                    0            212           0   0
##       0           0                    0              2           0   0
##       0           0                    0             46           0   0
##       0           0                    0             39           0   0
##       0           0                    0              1           0   0
##       0           0                    0            205           0   0
##       0           0                    0             12           1   0
##       0           0                    0              5           0   0
##       0           0                    0              3           0   0
##       0           0                    0             13           1   0
##       0           0                    0            211           0   0
##       0           0                    0            150           0   0
##       0           0                    1             28           0   0
##       0           0                    0             60           1   0
##       0           0                    0              8           0   0
##       0           0                    0             20           0   0
##       0           0                    0             55           0   0
##       0           0                    0              1           0   0
##       0           0                    0            765           0   0
##       0           0                    0            911           1   0
##       0           1                    0             69           0   0
##       0           1                    0             86           0   0
##       0           0                    0            100           0   0
##       0           0                    0            111           0   0
##       0           0                    0            240           0   0
##       0           0                    0             10           0   0
##       0           0                    0              7           0   0
##       2           0                    0            161           0   0
##       0           0                    0             54           0   0
##       0           0                    1            317           0   0
##       0           0                    0              2           0   0
##       1           1                    0             67           0   0
##       0           0                    0              2           0   0
##       0           0                    0              6           0   0
##       0           0                    0              9           0   0
##       0           0                    0            130           0   0
##       0           0                    0            226           0   0
##       0           1                    1            740           0   0
##       0           0                    0             47           0   0
##       0           1                    0            283           0   0
##       0           2                    0            614           0   0
##       0           1                    0             37           0   0
##       0           1                    0            229           0   0
##       0           1                    0            394           0   0
##       0           0                    0              3           0   0
##       0           0                    0            125           0   0
##       0           0                    0             64           1   0
##       0           0                    0            247           1   0
##       0           1                    0            145           0   0
##       0           0                    0             13           0   0
##       1           1                    0            212           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0            135           0   0
##       0           0                    0            203           0   0
##       0           1                    0             59           0   0
##       0           0                    0              4           0   0
##       0           0                    0              8           0   0
##       0           0                    0             10           0   0
##       0           0                    0            202           1   1
##       0           1                    0            236           1   0
##       0           0                    0            213           0   0
##       0           0                    0              6           0   0
##       0           0                    0              3           0   0
##       0           0                    0              5           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           1                    0            224           0   0
##       0           0                    0             23           0   0
##       0           0                    0              1           0   0
##       0           0                    0             47           0   0
##       0           0                    0             19           0   0
##       0           0                    0             18           0   0
##       0           0                    0             56           0   0
##       0           1                    0            139           0   0
##       0           0                    0            210           0   0
##       0           0                    0            260           0   0
##       0           0                    0            166           0   0
##       0           0                    0            217           0   1
##       0           0                    0             85           0   0
##       0           0                    0             78           0   0
##       0           0                    0            130           0   0
##       0           0                    0              2           0   0
##       0           0                    0             34           0   0
##       0           0                    0            129           0   0
##       0           0                    0             24           0   0
##       0           0                    0            233           0   0
##       0           0                    0             25           0   0
##       0           0                    0            130           0   0
##       0           0                    0             61           0   0
##       0           0                    0            103           0   0
##       0           0                    0            197           0   0
##       0           0                    0            151           0   0
##       0           0                    0             94           0   0
##       0           0                    0              3           0   0
##       0           0                    0             61           0   0
##       0           0                    0             32           0   0
##       0           0                    0              2           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           0                    0             27           0   0
##       0           0                    0             28           1   0
##       0           0                    0             33           0   0
##       0           0                    0              2           0   0
##       0           0                    0             13           0   0
##       0           0                    0             18           0   0
##       0           0                    0             16           0   0
##       0           0                    0              2           0   0
##       0           1                    0            205           0   0
##       0           0                    0             68           0   0
##       0           0                    0             37           0   0
##       0           0                    0              2           0   0
##       0           0                    0              6           0   0
##       0           0                    0             27           0   0
##       0           0                    0              5           0   0
##       0           0                    0             10           0   0
##       0           0                    0              9           0   0
##       0           0                    0              7           0   0
##       0           0                    0             19           0   0
##       0           0                    0              6           0   0
##       1           3                    0            270           0   0
##       0           0                    0             29           0   0
##       0           0                    0             33           0   0
##       0           1                    0             72           0   0
##       0           0                    0             53           0   0
##       0           0                    0             57           1   0
##       0           0                    0             53           0   0
##       0           0                    0            191           0   0
##       0           0                    0             10           0   0
##       0           0                    0              2           0   0
##       0           0                    0            183           0   0
##       0           0                    0              8           0   0
##       0           0                    0             10           0   0
##       0           0                    0             13           0   0
##       0           0                    0             29           0   0
##       0           0                    0             56           0   0
##       0           0                    0             55           0   0
##       0           0                    0             44           0   0
##       0           0                    0             20           0   0
##       0           0                    0             55           0   0
##       0           0                    0             25           0   0
##       0           0                    0            138           0   0
##       0           0                    0             16           0   0
##       0           0                    0             39           0   0
##       0           0                    0             44           0   0
##       0           1                    0             35           0   0
##       0           0                    0              6           0   0
##       0           0                    0             39           0   0
##       0           0                    0              2           0   0
##       1           0                    0            121           1   0
##       0           0                    0              3           0   0
##       0           0                    0             41           0   0
##       0           0                    0             22           0   0
##       0           0                    0              8           0   0
##       0           0                    0             13           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           0                    0              6           0   0
##       0           5                    0            175           0   1
##       0           5                    0            105           0   1
##       0           0                    0              2           0   0
##       0           4                    0            962           0   0
##       0           0                    0            158           1   0
##       0           0                    0             19           0   0
##       0           0                    0             19           0   0
##       0           0                    0             13           0   0
##       0           0                    0             44           0   0
##       0           0                    0             27           0   0
##       1           2                    0            158           0   0
##       0           0                    0             18           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              8           0   0
##       0           0                    0             50           0   0
##       0           0                    0             51           0   0
##       0           0                    0             39           0   0
##       0           0                    0             26           0   0
##       0           0                    0             10           0   0
##       0           0                    0             76           0   0
##       0           1                    0            561           0   0
##       0           0                    0             22           0   0
##       0           1                    0            274           0   0
##       0           1                    0            217           0   0
##       0           0                    0             73           0   0
##       0           0                    0             85           0   0
##       0           0                    0             55           0   0
##       5           6                    0            589           2   0
##       0           2                    0            214           0   0
##       0           0                    0            110           0   0
##       1           2                    0            190           0   0
##       0           0                    0             12           0   0
##       0           0                    0              5           0   0
##       0           0                    0              1           0   0
##       1           0                    0             49           0   0
##       0           0                    0              5           0   0
##       0           0                    0              5           0   0
##       0           0                    0             31           0   0
##       0           0                    1            674           0   0
##       0           0                    0              3           0   0
##       0           0                    0             27           0   0
##       0           0                    0             21           0   0
##       0           1                    0            364           2   0
##       1           0                    0            552           0   0
##       2           1                    0            651           0   0
##       0           0                    0            414           0   0
##       0           0                    0             18           0   0
##       0           4                    0            371           0   0
##       0           1                    0            568           0   0
##       1           0                    0            505           0   0
##       0           0                    0             73           0   0
##       0           0                    0             15           0   0
##       0           0                    0             26           0   0
##       0           0                    0              4           0   0
##       0           0                    0            118           0   0
##       0           0                    0            124           1   0
##       0           0                    0            128           0   0
##       0           0                    0             39           0   0
##       0           0                    0             83           0   0
##       0           0                    0             71           0   0
##       0           0                    0             11           0   0
##       0           0                    0              2           0   0
##       0           0                    0             72           0   0
##       0           0                    0            699           0   0
##       0           0                    0            298           0   0
##       0           1                    0            223           0   0
##       0           0                    0            581           0   0
##       0           0                    0            115           0   0
##       0           0                    0            331           1   0
##       0           0                    0             89           0   0
##       0           0                    0             27           0   0
##       0           0                    0             34           2   0
##       0           0                    0            350           0   0
##       0           0                    0             59           2   0
##       0           0                    0            192           0   0
##       0           0                    0             66           0   0
##       0           0                    0             86           0   0
##       0           1                    0             67           0   0
##       0           0                    0              2           0   0
##       0           0                    0             70           0   0
##       0           0                    0             66           0   0
##       0           0                    0            131           0   0
##       0           0                    0            103           0   0
##       0           0                    0            116           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0             48           0   0
##       1           0                    0            279           0   0
##       0           0                    0             14           0   0
##       0           0                    0             26           0   0
##       0           0                    0              1           0   0
##       0           0                    0            200           1   0
##       0           0                    0             43           0   0
##       0           0                    0             30           0   0
##       0           0                    1            126           1   0
##       0           0                    0            229           0   0
##       0           0                    0            355           0   0
##       0           0                    0            262           0   0
##       0           0                    0            308           0   0
##       0           0                    0            256           0   0
##       0           0                    0             93           0   0
##       0           1                    0            320           0   0
##       0           1                    0            382           0   0
##       0           0                    0             82           0   0
##       0           0                    0             77           0   0
##       0           1                    0            934           0   0
##       0           5                    0           1188           0   0
##       0           0                    0             55           0   0
##       0           1                    0            159           0   0
##       0           0                    0              2           0   0
##       1           0                    0            117           0   0
##       0           0                    0             28           0   0
##       0           0                    0             99           0   0
##       0           0                    0             31           0   0
##       0           0                    0              5           0   0
##       0           0                    0            209           0   0
##       0           0                    0            177           0   0
##       0           1                    0            113           0   0
##       0           0                    0             90           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           1                    0             48           0   0
##       0           0                    0            131           0   0
##       0           0                    0              1           0   0
##       0           0                    0             20           0   0
##       0           0                    0              9           0   0
##       0           0                    0              3           0   0
##       0           0                    0             40           0   0
##       0           0                    0             39           0   0
##       0           0                    0            238           0   0
##       0           0                    0            209           0   0
##       0           0                    0            240           0   0
##       0           0                    0            236           0   0
##       0           0                    0            239           0   0
##       0           0                    0            238           0   0
##       0           0                    0            109           0   0
##       0           0                    0              2           0   0
##       0           0                    0             16           0   0
##       0           0                    0             27           0   0
##       0           0                    0              1           0   0
##       0           1                    0            183           1   0
##       0           0                    0              7           0   0
##       0           0                    0            767           0   0
##       0           0                    0            123           0   0
##       0           0                    0            128           0   0
##       0           0                    0              4           0   0
##       0           0                    0             71           0   0
##       0           0                    0             62           0   0
##       0           0                    0            161           0   0
##       0           0                    0             83           0   0
##       0           1                    0            224           0   0
##       0           1                    0            235           0   0
##       0           1                    0             41           0   0
##       0           0                    0            106           0   0
##       0           1                    0            255           0   0
##       0           1                    0            332           0   0
##       2           2                    0            589           0   0
##       0           0                    0             89           0   0
##       0           0                    0             16           0   0
##       0           0                    1            621           0   0
##       0           0                    0            110           0   0
##       0           2                    0             77           0   0
##       0           0                    0            177           0   0
##       0           1                    0              0           0   0
##       0           0                    0            651           0   0
##       0           2                    0            778           1   0
##       0           2                    0             97           0   0
##       0           0                    0            626           0   0
##       0           0                    0             94           0   0
##       0           0                    0             25           0   0
##       1           0                    0             42           1   0
##       0           0                    0            163           0   0
##       0           0                    1             90           0   0
##       0           1                    0             84           0   0
##       0           0                    0             74           0   0
##       0           0                    0              0           0   0
##       0           0                    0              2           0   0
##       0           1                    0            354           1   0
##       1           1                    0             72           0   0
##       0           0                    0             67           0   0
##       0           0                    0            231           1   1
##       1           2                    0            231           2   0
##       0           0                    0             82           0   0
##       0           0                    0             29           0   0
##       0           0                    0            114           0   0
##       0           0                    0            115           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           1                    0             58           0   0
##       0           0                    0             41           0   0
##       0           0                    0             38           1   0
##       0           2                    0            390           0   0
##       0           0                    0             27           0   0
##       0           0                    0             88           0   0
##       0           0                    0            191           0   0
##       0           0                    0              3           0   0
##       0           0                    0            131           0   0
##       0           0                    0             51           0   0
##       0           0                    0            323           0   0
##       0           1                    0            621           0   0
##       0           1                    0            104           0   0
##       1           0                    0             85           0   0
##       0           0                    0              1           0   0
##       0           0                    0            124           0   0
##       0           0                    0              4           0   0
##       0           0                    0             30           0   0
##       0           0                    0             75           0   0
##       0           1                    0             77           0   0
##       0           0                    0             29           0   0
##       0           0                    0              7           0   0
##       0           0                    0              9           0   0
##       0           0                    0              8           0   0
##       0           0                    0             26           0   0
##       0           0                    0             44           0   0
##       0           0                    0            157           0   0
##       0           0                    0            292           0   0
##       0           0                    0            240           0   0
##       0           0                    0            134           0   0
##       0           0                    0             33           0   0
##       0           0                    0             46           0   0
##       0           0                    0             10           0   0
##       0           0                    0              6           0   0
##       0           0                    0             23           0   0
##       0           0                    0             10           0   0
##       0           2                    0             58           0   0
##       0           0                    0              1           0   0
##       1           0                    1            266           0   1
##       1           1                    1            277           0   1
##       5           3                    0           1015           0   1
##       1           3                    0           1008           2   0
##       0           0                    0              1           0   0
##       0           0                    0             39           0   0
##       0           0                    0             41           0   0
##       0           0                    0             14           0   0
##       0           0                    0             10           0   0
##       0           0                    0             12           0   0
##       0           0                    0            224           0   0
##       0           0                    0            286           0   0
##       0           0                    0              8           0   0
##       0           0                    0              6           0   0
##       0           0                    0            103           0   0
##       1           0                    0             70           0   0
##       0           1                    0            140           0   0
##       0           0                    0             99           0   0
##       0           0                    0            102           0   0
##       0           0                    0            211           0   0
##       0           2                    0            366           0   0
##       0           0                    0             77           0   0
##       0           0                    0              1           0   0
##       0           0                    0             14           0   0
##       0           0                    0             88           0   0
##       0           2                    0            923           0   0
##       0           1                    0            688           0   1
##       1           1                    0            858           0   0
##       1           7                    0            895           0   0
##       0           0                    0            296           1   0
##       0           0                    0            476           0   0
##       0           0                    0            426           0   0
##       1           1                    0            627           0   0
##       0           0                    0            332           0   0
##       0           2                    0            555           0   0
##       0           0                    0           1179           0   0
##       0           0                    0            823           0   0
##       1           3                    0           1960           0   1
##       0           0                    0            640           0   0
##       0           0                    0            140           0   0
##       0           1                    0            632           0   0
##       0           2                    0            804           0   0
##       0           1                    0            509           0   0
##       0           0                    0            470           1   0
##       0           0                    0              7           0   0
##       0           1                    0            667           0   0
##       0           2                    0            825           1   0
##       1           5                    0            741           1   0
##       0           1                    0           1148           1   0
##       0           0                    0            696           0   0
##       0           2                    0           1143           1   0
##       0           0                    0             28           0   0
##       0           1                    0            138           0   1
##       0           0                    0              2           0   0
##       0           0                    0             19           0   0
##       0           0                    0             44           0   0
##       0           0                    0              1           0   0
##       0           0                    0             34           0   0
##       0           0                    0            103           0   0
##       0           0                    0            317           0   0
##       0           0                    0            214           0   0
##       0           0                    0            133           0   0
##       0           0                    0            375           0   0
##       0           0                    0            101           0   0
##       0           0                    0            109           0   0
##       0           0                    0              7           0   0
##       0           0                    0              7           0   0
##       1           0                    0             77           0   0
##       1           0                    0             83           0   0
##       0           2                    0            173           0   0
##       0           0                    0             66           1   0
##       0           0                    0            146           0   0
##       1           1                    0            250           0   0
##       0           0                    0             77           0   0
##       0           0                    0            306           0   0
##       0           1                    0             97           0   0
##       0           1                    0            126           0   0
##       0           1                    0            228           0   0
##       0           1                    0            108           0   0
##       0           0                    0              2           0   0
##       0           2                    0            457           0   0
##       0           0                    0             25           0   0
##       0           0                    0             32           0   0
##       0           0                    0             14           0   0
##       0           0                    0             10           0   0
##       0           0                    0              1           0   0
##       0           2                    1            463           0   0
##       0           0                    0             13           0   0
##       0           0                    0              9           0   0
##       0           0                    0            153           0   0
##       0           0                    0             35           0   0
##       0           0                    0             32           0   0
##       0           0                    0             69           0   0
##       0           0                    0             54           0   0
##       0           0                    0             54           0   0
##       0           0                    0             53           0   0
##       0           0                    0             58           0   0
##       0           2                    0            290           0   0
##       0           1                    0             18           0   0
##       0           0                    0            124           0   0
##       0           0                    0             18           0   0
##       0           0                    0             10           0   0
##       0           0                    0              8           0   0
##       0           2                    0            133           0   0
##       0           0                    0             34           0   0
##       0           0                    0            105           0   0
##       0           0                    0            127           0   0
##       0           0                    0              8           0   0
##       0           0                    0             28           0   0
##       0           1                    0            266           0   1
##       0           1                    0             48           0   0
##       0           0                    0            211           0   0
##       0           0                    0             14           0   0
##       0           0                    0             84           0   0
##       0           0                    0             87           0   0
##       0           0                    0              1           0   0
##       0           0                    1            349           0   0
##       0           0                    0            147           0   0
##       0           0                    0              4           0   0
##       0           2                    0             51           0   0
##       0           0                    0             15           0   0
##       0           0                    0              1           0   0
##       0           0                    0             29           0   0
##       0           0                    0             79           0   0
##       0           0                    0             81           0   0
##       2           1                    0            167           1   0
##       2           1                    0            154           0   0
##       0           0                    0            128           0   0
##       0           0                    0              1           0   0
##       0           0                    0             93           0   0
##       0           0                    0             24           0   0
##       0           0                    0             44           0   0
##       0           0                    0              2           0   0
##       0           0                    0             21           0   0
##       0           0                    0            573           0   0
##       0           0                    0             94           0   0
##       0           0                    0             19           0   0
##       2           0                    0            118           0   0
##       0           0                    0             10           0   0
##       0           0                    0             37           0   0
##       0           0                    0              1           0   0
##       0           1                    1            348           0   0
##       0           0                    0             43           0   0
##       0           0                    0             99           0   0
##       0           0                    0             38           0   0
##       0           0                    0             62           0   0
##       0           0                    0              9           0   0
##       0           0                    0             26           0   0
##       0           0                    0             11           0   0
##       0           1                    0            127           0   0
##       0           0                    0             77           0   0
##       0           0                    0              5           0   0
##       0           0                    0             70           0   0
##       0           2                    0            168           0   0
##       0           0                    0              2           0   0
##       0           1                    0             62           0   0
##       0           0                    0             66           0   0
##       0           0                    0             56           0   0
##       0           0                    0             22           0   0
##       0           0                    0             33           0   0
##       0           0                    0             32           0   0
##       0           0                    0             30           0   0
##       0           0                    0             15           0   0
##       0           0                    0             30           0   0
##       0           0                    0             30           0   0
##       0           0                    0             13           0   0
##       0           0                    0             41           0   0
##       0           0                    0             38           0   0
##       0           0                    0             37           0   0
##       0           0                    0             28           0   0
##       0           0                    0             24           0   0
##       0           0                    0              5           0   0
##       0           0                    0             16           0   0
##       0           0                    0             25           0   0
##       0           0                    0             41           0   0
##       0           0                    0             11           0   0
##       0           0                    0              1           0   0
##       0           0                    0             14           0   0
##       0           0                    0              5           0   0
##       0           0                    0              8           0   0
##       0           0                    0             10           0   0
##       0           0                    0            130           0   0
##       0           0                    0             44           0   0
##       0           0                    0              1           0   0
##       0           0                    0            120           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0             63           0   0
##       0           0                    0              1           0   0
##       0           0                    0              6           0   0
##       0           0                    0              3           0   0
##       0           0                    0              8           0   0
##       0           0                    0             15           0   0
##       0           0                    0              1           0   0
##       1           0                    0            124           0   0
##       0           0                    0            212           0   0
##       0           0                    0            260           0   0
##       0           0                    0             13           0   0
##       0           0                    0              9           0   0
##       0           2                    0            113           0   0
##       0           0                    0             43           0   0
##       0           0                    0            303           0   1
##       0           0                    0              7           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           1                    0            631           0   0
##       0           0                    0             75           0   0
##       0           0                    0             67           0   0
##       0           0                    0            117           0   0
##       0           0                    0             84           0   0
##       0           1                    0            135           0   0
##       0           2                    0            479           0   0
##       0           0                    0             68           0   0
##       0           0                    0              8           0   0
##       0           0                    0             38           0   0
##       0           0                    0            550           0   0
##       0           3                    0             50           0   0
##       0           2                    0           1271           1   0
##       0           4                    0            714           0   0
##       1           5                    0            949           0   0
##       1           6                    0           1089           0   0
##       0           4                    0            449           0   0
##       0           1                    0            616           1   0
##       0           0                    0            314           0   0
##       1           3                    0           1032           0   0
##       2           6                    0           1421           2   0
##       0           0                    0            127           0   0
##       0           3                    0           1059           1   0
##       0           0                    0            185           0   0
##       0           2                    0           1055           0   0
##       0           0                    0              5           0   0
##       0           0                    0            561           0   1
##       0           5                    0            642           1   0
##       1           5                    0            894           0   0
##       0           2                    0            675           0   0
##       0           0                    0             26           0   0
##       2           1                    0            373           0   0
##       0           0                    0             15           0   0
##       0           0                    0              1           0   0
##       0           0                    0             98           0   0
##       0           0                    0             15           0   0
##       0           0                    0             76           0   0
##       0           0                    0             18           0   0
##       0           0                    0             83           1   0
##       0           1                    0            127           1   0
##       1           2                    0            176           2   0
##       0           1                    0            165           1   0
##       3           1                    0            217           1   0
##       0           0                    0             66           2   0
##       0           1                    0             69           1   0
##       3           0                    0            151           1   0
##       0           3                    0            233           1   0
##       0           0                    0             88           0   0
##       0           1                    0            104           2   0
##       0           0                    0            101           0   0
##       0           2                    0             69           0   1
##       0           2                    0            142           0   0
##       0           2                    0            110           1   0
##       0           5                    0            205           0   0
##       0           1                    0            136           0   0
##       0           2                    0            109           0   0
##       0           0                    0              4           0   0
##       0           4                    0            190           0   0
##       0           4                    0            152           0   0
##       0           2                    0             85           0   0
##       0           0                    0            177           0   0
##       1           0                    0            283           0   0
##       0           0                    0              1           0   0
##       0           0                    0             19           0   0
##       0           0                    0             27           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           1                    0             65           0   0
##       0           2                    0            118           0   0
##       0           0                    0             38           0   0
##       0           0                    0             20           0   0
##       0           1                    0            228           0   1
##       0           0                    0             24           0   0
##       0           3                    0             53           0   0
##       0           0                    0              1           0   0
##       0           0                    0             33           0   0
##       0           0                    0             20           0   0
##       0           0                    0             11           0   0
##       0           0                    0            259           0   0
##       0           0                    1            420           0   0
##       0           0                    0              1           0   0
##       0           0                    0            479           0   0
##       0           0                    0              2           0   0
##       0           0                    0            132           0   0
##       0           0                    0              5           0   0
##       0           0                    0             89           0   0
##       0           0                    0             15           0   0
##       0           1                    0            104           0   0
##       0           0                    0            203           0   0
##       0           0                    0            225           0   0
##       0           1                    1             90           0   0
##       0           0                    0            147           0   0
##       0           0                    0            146           0   0
##       0           3                    1            378           1   0
##       0           1                    0            227           0   0
##       0           0                    0             15           0   0
##       0           0                    0             37           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              7           0   0
##       0           0                    0              6           0   0
##       0           0                    0              5           0   0
##       0           0                    0             15           0   0
##       0           0                    0             23           0   0
##       0           0                    0             30           0   0
##       0           0                    0             85           0   0
##       0           0                    0             15           0   0
##       0           0                    0             33           0   0
##       0           0                    0             71           0   1
##       0           0                    0             33           0   0
##       0           0                    0            126           0   0
##       0           0                    0             31           1   0
##       0           1                    0            211           0   0
##       0           0                    0            133           0   0
##       0           2                    0            178           0   0
##       0           1                    0             81           0   0
##       0           0                    0              4           0   0
##       0           0                    0             48           1   0
##       0           1                    0             69           0   0
##       1           2                    0             60           3   0
##       0           1                    0             93           0   0
##       2           4                    0            106           1   0
##       0           1                    0             39           0   0
##       0           0                    0             28           2   0
##       1           1                    0             75           0   0
##       2           4                    0            134           1   0
##       0           0                    0            162           0   0
##       0           0                    0            144           0   0
##       3           4                    0            161           0   0
##       6           3                    1            273           0   1
##       0           0                    0             78           1   0
##       1           0                    0            115           1   0
##       3           1                    0            116           0   0
##       0           0                    0             62           0   0
##       1           0                    0            115           0   0
##       1           0                    0            135           0   0
##       0           0                    0            217           0   0
##       0           2                    0            238           0   0
##       0           0                    0              4           0   0
##       0           0                    0              1           0   0
##       0           0                    0            147           0   0
##       0           0                    0             81           1   0
##       0           2                    0            284           1   0
##       0           1                    0             55           0   0
##       0           0                    0             13           0   0
##       0           0                    0             59           0   0
##       0           0                    0             32           0   0
##       0           0                    0             47           0   0
##       0           0                    0             28           0   0
##       0           0                    0             26           0   0
##       0           0                    0             68           0   0
##       0           0                    0            134           0   0
##       0           0                    0             24           0   0
##       0           0                    0              9           0   0
##       0           0                    0             43           0   0
##       0           0                    0             34           0   0
##       0           0                    0             46           0   0
##       0           1                    0             32           0   0
##       0           0                    0             44           0   0
##       0           0                    0             45           0   0
##       0           0                    0             15           0   0
##       0           1                    0             49           0   0
##       0           0                    0             31           0   0
##       0           0                    0              3           0   0
##       0           0                    0              2           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0            108           0   0
##       0           0                    0            173           0   0
##       0           0                    0              1           0   0
##       0           0                    0             67           0   0
##       0           0                    0              2           0   0
##       2           1                    0             76           1   0
##       0           0                    0             41           0   0
##       0           1                    0            358           0   0
##       0           0                    0              8           0   0
##       0           0                    0             50           0   0
##       0           0                    0             27           0   0
##       0           0                    0             11           0   0
##       0           0                    0             11           0   0
##       0           0                    0             54           0   0
##       0           0                    0             81           0   0
##       0           0                    0             63           0   0
##       1           0                    0            207           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0            121           0   0
##       0           0                    0            175           0   0
##       0           0                    0              4           0   0
##       0           0                    0            156           0   0
##       0           0                    0              5           0   0
##       0           0                    0              7           0   0
##       0           0                    0             12           0   0
##       0           0                    0            119           0   0
##       0           1                    0             73           1   0
##       0           0                    0            159           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0            159           0   0
##       0           0                    0             40           0   0
##       2           0                    0             33           0   0
##       0           0                    0             25           0   0
##       0           0                    0              5           0   0
##       0           1                    0            332           0   0
##       0           0                    0             41           0   0
##       0           0                    0             21           0   0
##       0           1                    0             66           0   0
##       0           0                    0              3           0   0
##       0           2                    0             72           0   0
##       1           0                    0             71           0   0
##       0           0                    0              3           0   0
##       0           0                    0             66           0   0
##       0           0                    0            133           0   0
##       0           1                    0             40           0   0
##       0           0                    0              1           0   0
##       0           0                    0             11           0   0
##       0           0                    0             10           0   0
##       0           0                    0              5           0   0
##       0           0                    0            177           0   0
##       0           0                    0              1           0   0
##       0           0                    0             46           0   0
##       0           0                    0             56           0   0
##       0           2                    0             66           0   0
##       0           0                    0            465           0   0
##       0           0                    0           1233           0   0
##       0           0                    0            409           0   0
##       0           0                    0              9           0   0
##       0           0                    0             26           0   0
##       0           0                    0             14           0   0
##       0           0                    0             13           0   0
##       0           0                    0              1           0   0
##       0           0                    0              4           0   0
##       0           0                    0              3           0   0
##       0           0                    0              2           0   0
##       0           0                    0              2           0   0
##       0           0                    0              4           0   0
##       0           0                    0              2           0   0
##       0           0                    0             14           0   0
##       0           0                    0             22           0   0
##       0           0                    0             14           0   0
##       0           0                    0              4           0   0
##       0           0                    0              2           0   0
##       0           0                    0              5           0   0
##       0           0                    0             79           0   0
##       0           0                    0             29           0   0
##       0           0                    0             58           0   0
##       0           0                    0             42           0   0
##       0           0                    0            268           0   0
##       0           0                    0            486           1   0
##       1           0                    0            118           0   0
##       0           0                    0            130           0   0
##       0           0                    0              1           0   0
##       0           1                    0            155           0   0
##       0           0                    0             20           0   0
##       0           0                    0             43           0   0
##       0           0                    0             40           0   0
##       0           0                    0             24           0   0
##       0           0                    0             29           0   0
##       0           0                    0             25           0   0
##       0           0                    0             21           0   0
##       0           0                    0             24           0   0
##       0           0                    0             19           0   0
##       0           0                    0             18           0   0
##       0           0                    0             33           0   0
##       0           0                    0             16           0   0
##       0           0                    0             33           0   0
##       0           0                    0             34           0   0
##       0           0                    0             42           0   0
##       0           0                    0             32           0   0
##       0           0                    0             36           0   0
##       0           0                    0             28           0   0
##       0           0                    0             25           0   0
##       0           0                    0             23           0   0
##       0           0                    0             21           0   0
##       0           0                    0             35           0   0
##       0           0                    0             21           0   0
##       0           0                    0             69           0   0
##       0           0                    0             75           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           2                    0            133           0   0
##       0           4                    0            118           0   0
##       0           3                    0             53           0   0
##       0           3                    0            109           0   0
##       0           0                    0              3           0   0
##       0           0                    0             45           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           3                    0            343           1   0
##       0           0                    0             17           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0             87           0   0
##       0           0                    0             43           0   0
##       1           0                    0             22           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0             67           0   0
##       0           0                    0              4           0   0
##       0           0                    0             82           0   0
##       0           0                    0             86           0   0
##       0           0                    0             10           0   0
##       0           0                    0             13           0   0
##       0           1                    0             96           0   0
##       0           0                    0             93           0   0
##       0           0                    0              6           0   0
##       0           0                    0              8           0   0
##       0           0                    0             64           0   0
##       0           0                    0             47           0   0
##       0           0                    0            155           0   0
##       0           3                    0            184           0   0
##       0           0                    0            167           0   0
##       0           1                    0            244           0   0
##       0           0                    0             21           0   0
##       0           0                    0              4           0   0
##       0           1                    0             77           0   0
##       0           0                    0             31           0   0
##       0           1                    0            164           0   0
##       0           0                    0             24           0   0
##       0           0                    0            155           0   0
##       0           0                    0             16           0   0
##       0           1                    0             60           0   0
##       0           0                    0              1           0   0
##       0           0                    0             95           0   0
##       0           0                    0            180           0   0
##       0           0                    0            145           0   0
##       0           0                    0             39           0   0
##       0           1                    0             84           0   0
##       2           0                    0            201           0   0
##       0           0                    0              2           0   0
##       0           2                    0            128           0   0
##       0           1                    0            422           0   0
##       0           0                    0            509           0   0
##       0           2                    0            132           0   0
##       0           1                    1            198           0   0
##       0           0                    0            174           0   0
##       0           2                    0             71           0   0
##       0           1                    0            257           0   0
##       0           2                    0            219           0   0
##       0           3                    0            198           0   0
##       0           0                    0            171           0   0
##       0           3                    0            353           0   0
##       3           1                    0            399           0   0
##       0           0                    0            158           0   0
##       0           2                    0            111           0   0
##       0           1                    0             79           0   0
##       1           5                    0            223           0   0
##       2           4                    0            616           0   1
##       0           5                    0            307           0   0
##       0           2                    0            297           0   0
##       0           5                    0            116           0   0
##       0           4                    0            373           2   0
##       0           0                    0            113           0   0
##       0           1                    0             99           0   0
##       0           1                    0            140           1   0
##       0           0                    0             16           0   0
##       0           1                    0            165           1   0
##       0           1                    0            224           0   0
##       0           1                    0            125           0   0
##       0           1                    0            147           0   0
##       0           1                    0            109           0   0
##       0           1                    1             93           0   0
##       1           1                    0            581           1   0
##       0           5                    0            333           2   1
##       4           0                    0            801           2   0
##       4           6                    0            454           0   1
##       4           8                    0           1178           2   1
##       2           1                    0            616           1   0
##       0           2                    0            200           0   0
##       0           0                    0             18           0   0
##       0           0                    0             12           0   0
##       0           0                    0             12           0   0
##       0           0                    0              4           0   0
##       0           0                    0            213           0   0
##       0           0                    0              4           0   0
##       0           0                    0              1           0   0
##       0           0                    0             52           0   0
##       0           0                    0             53           0   0
##       0           0                    0            103           0   0
##       0           3                    0            360           0   0
##       0           0                    0            116           0   0
##       0           0                    0            139           0   0
##       0           0                    0              8           0   0
##       0           0                    0            119           0   0
##       0           0                    0             16           0   0
##       0           0                    0             16           0   0
##       0           0                    0             36           0   0
##       1           0                    0             39           0   0
##       0           0                    0             41           0   0
##       0           1                    0             30           0   0
##       0           0                    0              2           0   0
##       0           1                    0             76           0   0
##       0           0                    0             58           0   0
##       0           1                    0            102           0   0
##       0           1                    0             42           0   0
##       0           0                    0             43           0   0
##       0           0                    0             31           0   0
##       0           0                    0             31           0   0
##       0           0                    0             29           0   0
##       0           2                    0            425           0   0
##       1           1                    0            193           0   0
##       0           0                    0            204           0   0
##       1           0                    0            264           0   0
##       1           1                    0            344           0   1
##       0           0                    0            225           0   1
##       1           0                    0             29           0   0
##       3           5                    0            715           0   1
##       0           0                    0            262           0   0
##       0           0                    0             44           0   0
##       0           0                    0            320           0   0
##       0           1                    0           1163           0   0
##       0           0                    0            442           0   0
##       0           0                    0             90           3   0
##       1           1                    0            584           2   1
##       0           0                    0             90           1   0
##       0           0                    0            818           0   0
##       0           0                    0              1           0   0
##       0           0                    0             22           0   0
##       0           0                    0             18           1   0
##       0           0                    0              5           0   0
##       0           0                    0              4           0   0
##       0           0                    0              6           0   0
##       0           0                    0             28           0   0
##       0           0                    0             33           1   0
##       0           0                    0              5           0   0
##       0           0                    0              3           0   0
##       0           0                    0             20           0   0
##       0           0                    0             22           0   0
##       0           0                    0             85           0   0
##       0           0                    0            133           0   0
##       0           0                    0             20           0   0
##       0           0                    0             27           0   0
##       0           0                    0             21           0   0
##       0           0                    0             39           0   0
##       0           0                    0             61           0   0
##       0           0                    0             31           0   0
##       0           2                    0            214           0   0
##       0           0                    0            227           0   0
##       0           0                    0            228           0   0
##       0           0                    0            117           0   0
##       0           1                    0             73           0   0
##       0           5                    0           1615           0   0
##       0           0                    0            130           1   0
##       0           0                    0            104           0   0
##       1           1                    0             57           1   1
##       0           0                    0             64           0   0
##       0           1                    0             24           1   1
##       0           0                    0             21           0   0
##       0           0                    0             70           0   0
##       0           0                    0             67           0   0
##       0           0                    0             83           0   1
##       0           0                    0             76           0   0
##       0           0                    0             96           0   0
##       0           1                    0             63           0   0
##       0           0                    0            102           0   1
##       0           0                    0            466           0   0
##       0           0                    0             67           0   0
##       0           0                    0             54           0   0
##       0           0                    0             65           0   0
##       0           0                    0             79           0   0
##       0           0                    0             22           0   0
##       0           1                    0            125           0   0
##       0           0                    0              2           0   0
##       0           1                    0             67           0   0
##       0           0                    0              2           0   0
##       0           0                    0             24           0   0
##       0           0                    0            104           0   0
##       0           0                    0             59           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0              4           0   0
##       0           0                    0            162           0   0
##       0           0                    0             37           0   0
##       0           0                    0             31           0   0
##       0           1                    0            274           0   0
##       0           2                    0            110           0   0
##       0           1                    1            226           0   0
##       0           0                    0            135           0   0
##       0           0                    0            202           0   0
##       0           0                    0            148           0   0
##       0           0                    0             17           0   0
##       0           0                    0             12           0   0
##       0           0                    0            145           0   0
##       2           2                    0            148           0   0
##       0           0                    0             50           0   0
##       0           1                    0            317           0   0
##       0           0                    0            210           0   0
##       0           0                    0            490           0   0
##       0           0                    0             39           0   0
##       0           0                    0             55           0   0
##       0           0                    0              2           0   0
##       0           1                    0            433           0   0
##       0           0                    0            457           0   0
##       0           4                    0            142           1   0
##       0           2                    0            320           2   0
##       0           0                    0            256           0   0
##       0           0                    0             28           0   0
##       0           1                    0             75           0   0
##       0           0                    0             15           0   0
##       0           3                    0            285           0   0
##       0           1                    0             39           0   0
##       0           1                    0            127           0   0
##       0           2                    0             35           0   0
##       0           1                    0            114           0   0
##       0           1                    0             61           0   0
##       0           0                    0             72           0   0
##       0           0                    0            114           0   0
##       0           1                    0             71           0   0
##       0           1                    0             58           0   0
##       0           2                    0            264           0   1
##       0           2                    0            151           0   0
##       0           0                    0             31           0   0
##       0           0                    0             14           0   0
##       0           1                    0            108           0   0
##       0           0                    0              1           0   0
##       0           0                    0              5           0   0
##       0           1                    0             30           0   0
##       0           0                    0              6           0   0
##       3           2                    0            311           0   1
##       0           0                    0              0           0   0
##       0           0                    0              1           0   0
##       0           0                    0             10           0   0
##       0           0                    0              1           0   0
##       0           0                    0             35           1   0
##       0           0                    0            503           0   0
##       0           0                    0             11           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           0                    0              3           0   0
##       0           0                    0             24           0   0
##       0           0                    0             98           0   0
##       0           0                    0              6           0   0
##       0           0                    0              9           0   0
##       0           0                    0            122           1   0
##       0           0                    0             17           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0             39           0   0
##       0           0                    0              3           0   0
##       0           0                    0              1           0   0
##       0           0                    0              6           0   0
##       0           0                    0              3           0   0
##       0           0                    0            607           1   0
##       0           0                    0              1           0   0
##       0           0                    0             10           0   0
##       0           0                    0             15           0   0
##       0           0                    0             18           0   0
##       0           0                    0            103           0   0
##       0           1                    0            107           0   0
##       0           0                    0             21           0   0
##       0           0                    0            113           1   0
##       0           0                    0              4           0   0
##       0           0                    0              1           0   0
##       0           1                    0            234           0   0
##       0           0                    0            251           0   0
##       0           0                    0              9           0   0
##       0           0                    0              9           0   0
##       0           0                    0             30           0   0
##       0           2                    0            457           0   0
##       0           0                    0             83           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              4           0   0
##       0           0                    0             27           0   0
##       0           0                    0             19           0   0
##       0           0                    0              5           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0            248           0   0
##       0           0                    0             71           0   0
##       0           0                    0             45           0   0
##       0           0                    0              4           0   0
##       0           0                    0              2           0   0
##       0           0                    0             44           0   0
##       0           0                    0              4           0   0
##       0           0                    0              4           0   0
##       0           0                    0             27           0   0
##       0           0                    0             37           0   0
##       0           0                    0              9           0   0
##       0           0                    0             20           0   0
##       0           0                    0             17           0   0
##       0           0                    0             19           1   0
##       0           0                    0              5           0   0
##       0           0                    0             71           0   0
##       1           2                    1            359           1   2
##       0           0                    0             54           0   0
##       0           0                    0             11           0   0
##       0           0                    0              9           0   0
##       0           0                    0             18           0   0
##       0           1                    1            239           1   0
##       0           0                    0             41           0   0
##       0           0                    0             46           1   0
##       0           0                    0              7           0   0
##       0           0                    0             59           0   0
##       0           0                    0             18           0   0
##       0           0                    0              5           0   0
##       0           0                    0             15           0   0
##       0           0                    0             35           0   0
##       0           0                    0             27           0   0
##       0           0                    0              2           0   0
##       0           0                    0             44           0   0
##       0           0                    0            123           0   0
##       0           0                    0              1           0   0
##       0           0                    0             90           1   0
##       0           0                    0             10           0   0
##       0           0                    0              9           0   0
##       0           0                    0              3           0   0
##       0           0                    0              6           0   0
##       0           0                    0              2           0   0
##       0           1                    0             34           0   0
##       0           0                    0             10           0   0
##       0           1                    0             12           0   0
##       0           0                    0            144           0   0
##       0           0                    0             32           0   0
##       0           0                    0              0           0   0
##       0           0                    0             17           0   0
##       0           0                    0             31           1   1
##       0           0                    0            124           0   0
##       0           0                    0             97           0   0
##       0           1                    0            146           1   0
##       0           0                    0             12           0   0
##       0           0                    0             19           0   0
##       0           5                    0            291           0   1
##       0           1                    0             36           0   0
##       0           1                    0             89           0   0
##       0           0                    0              1           0   0
##       0           0                    0             21           0   1
##       1           2                    0            181           1   0
##       0           0                    0              2           0   0
##       0           1                    0             34           0   0
##       0           3                    0            731           0   0
##       0           0                    0             14           0   0
##       0           0                    0              6           0   0
##       0           0                    0             59           0   0
##       0           1                    0             70           0   0
##       0           0                    0              9           0   0
##       0           0                    0             13           0   0
##       0           0                    0             15           0   0
##       0           0                    0              3           1   0
##       0           0                    0             48           0   0
##       0           0                    0              1           0   0
##       0           0                    0              9           0   0
##       0           0                    0              6           0   0
##       0           0                    0             14           0   0
##       0           0                    0             60           0   0
##       0           0                    0             15           0   0
##       0           0                    0             34           0   0
##       0           0                    0              8           0   0
##       0           0                    0             79           0   0
##       0           0                    0              2           0   0
##       0           0                    0              4           0   0
##       0           0                    0            134           0   0
##       0           0                    0            109           0   0
##       1           0                    0            392           0   0
##       1           1                    0            156           0   0
##       0           0                    0              7           0   0
##       0           0                    0             23           0   0
##       0           0                    0              2           0   0
##       0           0                    0             15           0   0
##       0           0                    0              5           0   0
##       0           0                    0             15           0   0
##       0           0                    0             17           0   0
##       0           0                    0              7           0   0
##       0           1                    0             48           0   0
##       0           1                    0             32           0   0
##       0           0                    0              2           0   0
##       0           1                    0             38           0   0
##       0           0                    0              1           0   0
##       0           0                    0              3           0   0
##       0           0                    0              8           0   0
##       0           1                    0            180           0   0
##       0           0                    0            323           0   0
##       0           0                    0            107           0   0
##       0           0                    0             25           0   0
##       2          11                    0            377           2   0
##       1           2                    0            511           1   0
##       2          18                    0            510           0   1
##       0          11                    0            401           3   0
##       0           1                    1            507           1   0
##       2          18                    1            503           1   0
##       0           0                    0            113           0   0
##       0           0                    0            213           0   0
##       0           0                    0            336           0   0
##       0           0                    0              1           0   0
##       0           0                    0             81           0   0
##       0           1                    0            834           0   0
##       0           0                    0            123           0   0
##       0           0                    0             92           0   0
##       0           0                    0              2           0   0
##       0           0                    0             20           0   0
##       0           0                    0             76           0   0
##       0           0                    0            105           0   0
##       0           0                    0             12           0   0
##       0           0                    0            143           0   0
##       0           0                    0            219           0   0
##       0           0                    0             24           0   0
##       0           1                    0            179           1   0
##       0           0                    0             38           0   0
##       0           0                    0            139           1   0
##       0           0                    0              1           0   0
##       0           0                    0              6           0   0
##       0           0                    0             75           0   0
##       0           0                    0              2           0   0
##       0           0                    0             29           0   0
##       0           0                    0             57           0   0
##       0           0                    0            772           1   0
##       1           0                    0             40           0   0
##       0           2                    0            200           1   0
##       0           3                    0            374           2   0
##       0           1                    0            386           2   0
##       0           3                    0            288           2   0
##       0           0                    0             33           0   0
##       0           0                    0             64           0   0
##       0           0                    0             13           0   0
##       0           0                    0             60           0   0
##       0           0                    0            102           0   0
##       0           0                    0              1           0   0
##      22          31                    1             52           0   0
##       0           1                    0            151           0   0
##       0           0                    0             16           0   0
##       0           0                    0            542           0   0
##       0           0                    0            334           0   0
##       0           0                    0              3           0   0
##       0           0                    0             25           0   0
##       0           0                    0            130           0   0
##       0           0                    0              2           0   0
##       0           0                    0            299           0   0
##       0           0                    0            104           0   0
##       0           2                    0             60           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0              3           0   0
##       0           0                    0             28           0   0
##       0           0                    0             44           0   0
##       0           0                    0             15           0   0
##       0           0                    0              8           0   0
##       0           0                    0              5           0   0
##       0           0                    0              1           0   0
##       0           0                    0             19           0   0
##       0           0                    0             14           0   0
##       0           0                    0              1           0   0
##       0           0                    0              3           0   0
##       0           1                    0            242           0   0
##       0           0                    0              2           0   0
##       0           0                    0             14           0   0
##       0           0                    0             26           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              2           0   0
##       0           0                    0             12           0   0
##       0           0                    0             15           0   0
##       0           0                    0             10           0   0
##       0           0                    0              5           0   0
##       0           0                    0             14           0   0
##       0           0                    0              3           0   0
##       0           0                    0              2           0   0
##       0           0                    0             87           0   0
##       0           0                    0             50           0   0
##       0           0                    0              3           0   0
##       0           0                    0              2           0   0
##       0           0                    0             10           0   0
##       0           0                    0              1           0   0
##       0           0                    0             98           0   0
##       0           0                    0             20           0   0
##       0           0                    0             76           0   0
##       0           1                    0            258           0   0
##       0           0                    0             53           0   0
##       0           0                    0              3           0   0
##       4           2                    0            875           2   0
##       0           0                    0              5           0   0
##       0           0                    0            219           0   0
##       0           0                    0             41           0   0
##       0           1                    0            190           0   0
##       0           0                    0              8           0   0
##       0           0                    0              5           0   0
##       0           0                    0            101           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0            338           0   0
##       0           2                    0           1049           0   0
##       0           0                    0            421           0   0
##       0           0                    0              6           0   0
##       0           0                    0            359           0   0
##       0           1                    0             31           0   0
##       0           2                    0            144           0   0
##       0           2                    0            176           0   0
##       0           1                    0            102           0   0
##       0           1                    0            132           0   0
##       0           2                    0            152           0   0
##       0           2                    0            234           0   0
##       0           1                    0            162           0   0
##       1           0                    0            717           0   0
##       0           0                    0             10           0   0
##       0           0                    0             82           0   0
##       1           4                    0            559           1   1
##       0           1                    0            102           0   0
##       0           0                    0             35           0   0
##       0           4                    0            210           0   0
##       0           0                    0             11           0   0
##       0           0                    0            129           0   0
##       0           0                    0             95           0   0
##       0           0                    0              5           0   0
##       0           0                    0             36           0   0
##       0           2                    0            422           0   0
##       0           0                    0             67           0   0
##       0           0                    0            133           0   0
##       0           0                    0             18           0   0
##       0           0                    0            110           0   0
##       0           0                    0             83           0   0
##       0           0                    0            297           0   0
##       0           0                    0            107           0   0
##       1           2                    0            256           0   0
##       0           0                    0            151           0   0
##       0           0                    0             16           0   0
##       0           1                    0            723           1   0
##       0           0                    0             98           0   0
##       0           0                    0            142           0   0
##       0           0                    0             60           1   0
##       0           1                    0            466           2   0
##       0           0                    0             20           0   0
##       0           0                    0            140           0   0
##       0           0                    0            222           0   0
##       1           1                    0            238           1   0
##       0           0                    0             80           0   0
##       0           0                    0              5           0   0
##       0           0                    0             10           0   0
##       0           3                    0            108           0   0
##       0           0                    0             58           0   0
##       0           0                    0              7           0   0
##       0           0                    0             72           0   0
##       0           0                    0              1           0   0
##       0           2                    0             96           0   0
##       0           0                    0             19           0   0
##       0           1                    0            116           0   0
##       0           1                    0             80           0   0
##       0           8                    0            386           0   1
##       0           0                    0            208           0   0
##       0           3                    0            457           1   0
##       3           5                    0            923           0   0
##       0           5                    0            178           0   0
##       0           2                    0            314           0   1
##       0           0                    0             99           0   0
##       0          11                    0            238           2   1
##       0           2                    0            136           0   0
##       0           5                    0            406           0   0
##       0           0                    0            253           0   0
##       0           0                    0            467           0   0
##       0           3                    0            453           0   0
##       0           4                    0            240           0   1
##       0           1                    0             47           0   0
##       0           0                    0            132           0   0
##       0           1                    0            298           0   0
##       1           5                    0            536           0   0
##       0           4                    0             63           0   0
##       0           0                    0            318           0   0
##       0           0                    0             63           0   0
##       0           0                    0            216           0   0
##       1           2                    0            199           0   0
##       0           1                    0            158           0   0
##       0           0                    0            197           0   0
##       0           0                    0            137           0   0
##       0           3                    0            315           0   0
##       0           0                    0             35           0   0
##       0           4                    0            297           0   1
##       0           0                    0            146           1   0
##       0           0                    0              1           0   0
##       0           0                    0             33           0   0
##       0           3                    0            336           0   1
##       0           1                    0             98           0   0
##       1           0                    0            118           0   0
##       0           2                    0            341           0   0
##       0           0                    0            145           0   0
##       0           0                    0              3           0   0
##       0           3                    0            396           0   1
##       0           0                    0             68           0   0
##       5           8                    0            672           1   0
##       0           0                    0             98           0   0
##       1           4                    0            159           0   0
##       0           0                    0             16           0   0
##       0           2                    0            425           0   0
##       0           0                    0             57           0   0
##       0           3                    0             87           0   0
##       0           1                    0             80           0   0
##       0          12                    1           1711           2   2
##       0           1                    0            274           0   1
##       0           0                    0              7           0   0
##       0           1                    0            259           0   1
##       0           1                    0            185           0   0
##       0           2                    0            338           0   0
##       0           1                    0            267           0   0
##       0           2                    0            382           0   0
##       0           2                    0             66           0   0
##       0           0                    0            156           0   0
##       0           2                    0            364           0   1
##       0           1                    0             99           0   0
##       0           1                    0            140           0   0
##       0           0                    0             29           0   0
##       0           0                    0              3           0   0
##       0           0                    0              7           0   0
##       0           0                    0              3           0   0
##       0           0                    0             19           0   0
##       0           0                    0              5           0   0
##       0           0                    0            161           0   0
##       0           0                    0             21           0   0
##       0           0                    0            105           1   0
##       0           0                    0            152           0   0
##       0           0                    0             12           0   0
##       0           0                    0             13           1   0
##       0           0                    0             13           0   0
##       0           0                    0             59           0   0
##       0           1                    0             61           0   0
##       0           2                    0             41           0   1
##       0           1                    0             72           0   0
##       0           0                    0              4           0   0
##       0           1                    0             46           0   0
##       0           1                    0             25           0   0
##       0           0                    0             38           0   0
##       0           1                    0             38           0   0
##       1           6                    0            290           1   0
##       0           3                    0            221           2   0
##       0           0                    0            134           1   0
##       0           5                    1            591           0   0
##       0           0                    0            134           0   0
##       0           0                    0            313           0   0
##       0           0                    0             66           0   0
##       0           4                    0            244           0   0
##       0           1                    0            285           0   0
##       0           0                    0            151           0   0
##       4           7                    1            823           1   1
##       0           3                    0            240           0   0
##       0           0                    0              2           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           1                    0            307           1   0
##       0           0                    0            954           0   0
##       0           1                    0            249           0   1
##       0           1                    0            300           0   1
##       0           1                    0            134           0   0
##       0           0                    0            310           0   0
##       0           1                    0            181           0   0
##       0           2                    0            216           0   1
##       0           2                    0            135           0   0
##       0           0                    0            270           0   1
##       0           0                    0            135           0   0
##       0           4                    0            402           0   0
##       0           0                    0             50           0   0
##       0           0                    0             25           0   0
##       0           0                    0             61           0   0
##       0           0                    0             43           0   0
##       0           0                    0             20           0   0
##       0           0                    0             38           0   0
##       0           1                    0            113           0   0
##       0           0                    0              5           0   0
##       0           0                    0              4           0   0
##       0           4                    1            306           0   0
##       0           0                    0              2           0   0
##       0           0                    0            170           0   0
##       0           0                    0            231           0   0
##       0           0                    0              1           0   0
##       0           0                    0             43           0   0
##       0           1                    0            339           0   1
##       0           0                    0            208           0   0
##       0           0                    0            326           0   1
##       0           0                    0            297           0   0
##       0           0                    0            129           0   0
##       0           0                    0             33           0   0
##       0           0                    0              7           0   0
##       0           1                    0            207           0   0
##       0           1                    0             91           0   0
##       0           1                    0            133           0   0
##       0           0                    0            149           0   0
##       0           0                    0              9           0   0
##       0           1                    0            153           0   0
##       0           0                    0             49           0   0
##       0           0                    0             74           0   0
##       0           0                    0             62           1   0
##       0           0                    0             63           0   0
##       0           0                    0             48           0   0
##       0           0                    0              2           0   0
##       0           0                    0             91           0   0
##       0           0                    0              1           0   0
##       0           0                    0             63           0   0
##       0           0                    0             40           0   0
##       0           5                    0            975           0   0
##       0           1                    0            307           0   0
##       0           1                    0            450           1   0
##       0           0                    0              3           0   0
##       0           0                    0             14           0   0
##       0           0                    0              4           0   0
##       0           2                    0            195           1   0
##       0           2                    0            236           2   0
##       0           3                    0            193           0   0
##       0           0                    0             22           0   0
##       0           0                    0             26           0   0
##       4           9                    0            408           0   0
##       0           0                    0            272           0   0
##       3          17                    0            441           1   1
##       0           0                    0             74           0   0
##       0           0                    0             10           0   0
##       0           0                    0             13           0   0
##       0           0                    0             13           0   0
##       0           0                    0             33           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0             23           0   0
##       0           0                    0             78           0   0
##       0           0                    0             35           0   0
##       0           0                    0             26           0   0
##       0           0                    0              5           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0             69           0   0
##       0           0                    0             42           0   0
##       0           0                    0             63           0   0
##       0           0                    0              2           0   0
##       0           0                    0             29           0   0
##       0           0                    0              9           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0             67           0   0
##       0           1                    0            158           0   0
##       0           0                    0             25           0   0
##       0           0                    0              9           0   0
##       0           0                    0            173           0   0
##       0           1                    0            184           0   0
##       0           0                    0            126           0   0
##       0           0                    0             16           0   0
##       0           0                    0            226           2   0
##       0           0                    0              1           0   0
##       0           0                    0            106           0   0
##       0           0                    0              1           0   0
##       0           0                    0              2           0   0
##       0           0                    0              1           0   0
##       0           0                    0            143           0   0
##       0           0                    0             91           0   0
##       0           0                    0            143           0   1
##       0           1                    0            335           0   0
##       0           0                    0             53           0   0
##       0           0                    0              1           0   0
##       0           0                    0            117           0   0
##       0           1                    0            426           0   0
##       0           6                    0            423           0   0
##       0           0                    0             14           0   0
##       0           0                    0             52           0   0
##       0           0                    0              7           0   0
##       0           1                    1            754           0   0
##       0           0                    0            237           0   0
##       0           0                    0             57           0   0
##       0           0                    0             50           0   0
##       0           0                    0             76           1   0
##       0           0                    0              1           0   0
##       0           0                    0              6           0   0
##       0           0                    0             14           0   0
##       0           0                    0              4           0   0
##       0           0                    0              4           0   0
##       0           0                    0              1           0   0
##       0           0                    0             11           0   0
##       0           0                    0              1           0   0
##       0           0                    0             10           0   0
##       0           0                    0              1           0   0
##       0           0                    0              3           0   0
##       0           0                    0              3           0   0
##       0           0                    0              5           0   0
##       0           0                    0              4           0   0
##       0           0                    0              2           0   0
##       0           0                    0             16           0   0
##       0           0                    0             10           0   0
##       0           0                    0              4           0   0
##       0           0                    0              2           0   0
##       0           0                    0              7           0   0
##       0           0                    0              5           0   0
##       0           0                    0              7           0   0
##       0           0                    0              4           0   0
##       0           0                    0              9           0   0
##       0           0                    0              7           0   0
##       0           0                    0              2           0   0
##       0           0                    0              4           0   0
##       0           0                    0             16           0   0
##       0           0                    0              2           0   0
##       0           0                    0              3           0   0
##       0           0                    0              8           0   0
##       0           0                    0              1           0   0
##       0           0                    0              4           0   0
##       0           0                    0              1           0   0
##       0           0                    0              1           0   0
##       0           0                    0              7           0   0
##       0           0                    0              3           0   0
##       0           0                    0              5           0   0
##       0           0                    0              2           0   0
##       0           0                    0              4           0   0
##       0           0                    0            114           0   0
##       0           0                    0              2           0   0
##       0           0                    0              2           0   0
##       0           0                    0            164           0   0
##       0           0                    0              6           0   0
##       0           0                    0              3           0   0
##       2           1                    0            215           0   0
##       0           0                    0            163           0   0
##       2           1                    0            261           0   1
##       0           0                    0              0           0   0
##       0           1                    0            182           0   2
##       1           0                    0            211           0   0
##       1           2                    0            336           0   0
##       0           0                    0             76           0   0
##       0           1                    0            356           0   0
##       0           0                    0            111           0   0
##       0           3                    0            314           1   2
##       0           0                    0            520           1   1
##       0           3                    0            335           0   0
##       0           2                    0            173           0   0
##       1           1                    0            384           0   0
##       0           1                    0            115           0   0
##       0           0                    0             30           0   0
##       0           0                    0             69           0   0
##       0           0                    0              3           0   0
##       0           1                    0            136           0   1
##       0           0                    0            118           1   0
##       0           1                    0            174           1   0
##       0           0                    0              0           0   0
##       1           0                    0            147           0   0
##       0           0                    0              9           0   0
##       0           0                    0              7           0   1
##       0           0                    0              7           0   1
##       0           0                    0              4           0   1
##       0           0                    0             66           0   0
##       3           1                    0            130           0   0
##       0           0                    0              4           0   0
##       0           1                    0             81           1   0
##       0           0                    0            290           2   0
##       0           0                    0            236           2   0
##       0           0                    0            393           0   2
##       1           4                    0            344           2   0
##       0           0                    0              5           0   0
##       0           0                    0            102           0   0
##       0           0                    0             96           0   0
##       1           4                    0            291           3   0
##       0           0                    0            130           0   0
##       4           3                    1            482           0   2
##       0           0                    0            124           0   0
##       0           0                    0             20           0   0
##       3           1                    0            395           0   1
##       0           0                    0              9           0   0
##       0           0                    0              5           0   0
##       0           1                    0             71           0   0
##       0           1                    0             49           0   0
##       0           0                    0              2           0   0
##       0           0                    0             94           0   0
##       0           0                    0             51           0   0
##       0           0                    0             90           0   0
##       0           0                    0             57           0   0
##       0           1                    0             74           1   0
##       0           0                    0             89           0   0
##       0           1                    0            123           0   0
##       0           1                    0            153           0   0
##       0           0                    0             92           0   0
##  [ reached 'max' / getOption("max.print") -- omitted 961 rows ]

Hallazgos 1. No hay una columna de revenue 2. Hay precios y cantidades negativos YA 3. Hay NA’s en Customer ID

Limpiar base de datos

Encontrar duplicados

bdsuper1 <- bdsuper
bdsuper1[duplicated(bdsuper1),]
##        BillNo                            Itemname Quantity           Date Price
## 509    536409         UNION JACK FLAG LUGGAGE TAG        1 01/12/10 11:45  1.25
## 519    536409       HAND WARMER SCOTTY DOG DESIGN        1 01/12/10 11:45  2.10
## 529    536409      SET 2 TEA TOWELS I LOVE LONDON        1 01/12/10 11:45  2.95
## 531    536409        SCOTTIE DOG HOT WATER BOTTLE        1 01/12/10 11:45  4.95
## 547    536412   ROUND SNACK BOXES SET OF 4 SKULLS        1 01/12/10 11:49  2.95
## 579    536412                FELTCRAFT DOLL MOLLY        1 01/12/10 11:49  2.95
## 581    536412   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 01/12/10 11:49  3.75
## 586    536412      CHRISTMAS CRAFT TREE TOP ANGEL        1 01/12/10 11:49  2.10
## 590    536412           12 DAISY PEGS IN WOOD BOX        1 01/12/10 11:49  1.65
## 592    536412         FELTCRAFT CUSHION BUTTERFLY        2 01/12/10 11:49  3.75
## 593    536412           12 DAISY PEGS IN WOOD BOX        2 01/12/10 11:49  1.65
## 596    536412           12 DAISY PEGS IN WOOD BOX        2 01/12/10 11:49  1.65
## 597    536412              TOTE BAG I LOVE LONDON        7 01/12/10 11:49  2.10
## 608    536412     FOLDING UMBRELLA CREAM POLKADOT        1 01/12/10 11:49  4.95
## 609    536412      SET 2 TEA TOWELS I LOVE LONDON        2 01/12/10 11:49  2.95
## 610    536412 FOLDING UMBRELLA RED/WHITE POLKADOT        1 01/12/10 11:49  4.95
## 612    536412   S/4 VALENTINE DECOUPAGE HEART BOX        1 01/12/10 11:49  2.95
## 750    536446       HANGING GLASS ETCHED TEALIGHT        6 01/12/10 12:15  1.65
## 823    536464       HAND WARMER SCOTTY DOG DESIGN        1 01/12/10 12:23  2.10
## 827    536464       CHRISTMAS METAL TAGS ASSORTED        6 01/12/10 12:23  0.85
## 844    536464      VINTAGE PAISLEY STATIONERY SET        1 01/12/10 12:23  2.95
## 851    536464       HAND WARMER SCOTTY DOG DESIGN        1 01/12/10 12:23  2.10
## 883    536488 ROTATING SILVER ANGELS T-LIGHT HLDR        1 01/12/10 12:31  2.55
## 1052   536522   SET/10 RED POLKADOT PARTY CANDLES        1 01/12/10 12:49  1.25
## 1058   536522  SET/10 PINK POLKADOT PARTY CANDLES        1 01/12/10 12:49  1.25
## 1131   536528              HAND WARMER OWL DESIGN        1 01/12/10 13:17  2.10
## 1144   536528     IVORY ENCHANTED FOREST PLACEMAT        1 01/12/10 13:17  1.65
## 1150   536528      PACK OF 6 PANNETONE GIFT BOXES        2 01/12/10 13:17  2.55
## 1156   536528              PAPER CHAIN KIT LONDON        1 01/12/10 13:17  2.95
## 1157   536528  MAKE YOUR OWN FLOWERPOWER CARD KIT        1 01/12/10 13:17  2.95
## 1158   536528      MAKE YOUR OWN MONSOON CARD KIT        2 01/12/10 13:17  2.95
## 1160   536528   JUMBO SHOPPER VINTAGE RED PAISLEY        1 01/12/10 13:17  1.95
## 1163   536528       SET OF 72 GREEN PAPER DOILIES        1 01/12/10 13:17  1.45
## 1170   536528     3 TIER CAKE TIN GREEN AND CREAM        1 01/12/10 13:17 14.95
## 1196   536530           SWALLOW SQUARE TISSUE BOX        1 01/12/10 13:21  1.25
## 1213   536531                  RED RETROSPOT WRAP       25 01/12/10 13:23  0.42
## 1719   536544      METAL SIGN,CUPCAKE SINGLE HOOK        1 01/12/10 14:32  2.51
## 1956   536551      SET 2 TEA TOWELS I LOVE LONDON        1 01/12/10 14:34  2.95
## 1969   536551            PLASTERS IN TIN SPACEBOY        1 01/12/10 14:34  1.65
## 1973   536551          CHOCOLATE HOT WATER BOTTLE        1 01/12/10 14:34  4.95
## 1974   536551 SET OF 2 TEA TOWELS APPLE AND PEARS        1 01/12/10 14:34  2.95
## 2039   536557     SET OF 3 BABUSHKA STACKING TINS        1 01/12/10 14:41  4.95
## 2060   536559              FEATHER PEN,LIGHT PINK       12 01/12/10 14:54  0.85
## 2149   536569        SCOTTIE DOG HOT WATER BOTTLE        1 01/12/10 15:35  4.95
## 2167   536569    CHRISTMAS HANGING TREE WITH BELL        1 01/12/10 15:35  1.25
## 2887   536592      METAL SIGN,CUPCAKE SINGLE HOOK        1 01/12/10 17:06  2.51
## 3492   536637              GOLD MINI TAPE MEASURE        1 02/12/10 11:35  0.85
## 3504   536637              HAND WARMER UNION JACK        1 02/12/10 11:35  2.10
## 3522   536637             HAND WARMER BIRD DESIGN        1 02/12/10 11:35  2.10
## 3540   536637                HERB MARKER ROSEMARY        1 02/12/10 11:35  0.65
## 3541   536637                   HERB MARKER BASIL        1 02/12/10 11:35  0.65
## 3546   536637    SET/9 CHRISTMAS T-LIGHTS SCENTED        1 02/12/10 11:35  1.25
## 3547   536637                 WICKER WREATH LARGE        1 02/12/10 11:35  1.95
## 3552   536637                   DELUXE SEWING KIT        1 02/12/10 11:35  5.95
## 3951   536742              PLASTERS IN TIN SKULLS        1 02/12/10 13:14  1.65
## 4068   536749    CUT GLASS HEXAGON T-LIGHT HOLDER        2 02/12/10 13:49  2.55
## 4069   536749                    CLAM SHELL SMALL        2 02/12/10 13:49  2.10
## 4080   536749                          PHOTO CUBE        2 02/12/10 13:49  1.65
## 4089   536749   GROW YOUR OWN BASIL IN ENAMEL MUG        1 02/12/10 13:49  2.10
## 4092   536749           TV DINNER TRAY DOLLY GIRL        1 02/12/10 13:49  4.95
## 4094   536749                    CLAM SHELL SMALL        2 02/12/10 13:49  2.10
## 4103   536749                          PHOTO CUBE        2 02/12/10 13:49  1.65
## 4105   536749        AIRLINE BAG VINTAGE TOKYO 78        1 02/12/10 13:49  4.25
## 4541   536796   AIRLINE BAG VINTAGE JET SET WHITE        2 02/12/10 15:46  4.25
## 4544   536796                           SPACE OWL        1 02/12/10 15:46  1.25
## 4570   536796           PACK OF 6 BIRDY GIFT TAGS        1 02/12/10 15:46  1.25
## 4575   536796            PACK OF 12 SKULL TISSUES        1 02/12/10 15:46  0.29
## 4576   536796     12 MESSAGE CARDS WITH ENVELOPES        1 02/12/10 15:46  1.65
## 4581   536796              PLASTERS IN TIN SKULLS        1 02/12/10 15:46  1.65
## 4582   536796            PACK OF 12 SKULL TISSUES        1 02/12/10 15:46  0.29
## 4584   536796             PACK OF 12 SUKI TISSUES        1 02/12/10 15:46  0.29
## 4585   536796         PACK OF 12 WOODLAND TISSUES        1 02/12/10 15:46  0.29
## 4591   536796               BALLOONS  WRITING SET        1 02/12/10 15:46  1.65
## 4601   536796    WOODLAND DESIGN  COTTON TOTE BAG        1 02/12/10 15:46  2.25
## 4602   536796     60 CAKE CASES VINTAGE CHRISTMAS        1 02/12/10 15:46  0.55
## 4606   536796         WOODEN SCHOOL COLOURING SET        1 02/12/10 15:46  1.65
## 4615   536796              WOODLAND CHARLOTTE BAG        1 02/12/10 15:46  0.85
## 4618   536796           POPPY'S PLAYHOUSE BEDROOM        1 02/12/10 15:46  2.10
## 4630   536796              TOTE BAG I LOVE LONDON        1 02/12/10 15:46  2.10
## 4659   536798                HOT BATHS METAL SIGN       12 02/12/10 15:55  2.10
## 4663   536798                   GIN AND TONIC MUG        6 02/12/10 15:55  1.25
## 5080   536846      RED STRIPE CERAMIC DRAWER KNOB        2 02/12/10 19:59  1.25
## 5082   536846 WHITE SPOT BLUE CERAMIC DRAWER KNOB        2 02/12/10 19:59  1.25
## 5111   536846         12 PENCILS TALL TUBE SKULLS        1 02/12/10 19:59  0.85
## 5113   536846         GREY HEART HOT WATER BOTTLE        1 02/12/10 19:59  3.75
## 5119   536846  12 PENCILS TALL TUBE RED RETROSPOT        1 02/12/10 19:59  0.85
## 5122   536846         12 PENCILS SMALL TUBE SKULL        1 02/12/10 19:59  0.65
## 5359   536863             LUNCH BAG  BLACK SKULL.        1 03/12/10 11:19  1.65
## 5380   536863           POPPY'S PLAYHOUSE BEDROOM        1 03/12/10 11:19  2.10
## 5386   536863      LARGE PURPLE BABUSHKA NOTEBOOK        1 03/12/10 11:19  1.25
## 5388   536863               BLUE CALCULATOR RULER        2 03/12/10 11:19  1.25
## 5390   536863             LUNCH BAG PINK POLKADOT        1 03/12/10 11:19  1.65
## 5391   536863              LUNCH BAG SUKI  DESIGN        1 03/12/10 11:19  1.65
## 5604   536874       HAND WARMER SCOTTY DOG DESIGN        1 03/12/10 11:35  2.10
## 5616   536874        BLUE COAT RACK PARIS FASHION        1 03/12/10 11:35  4.95
## 5625   536874       HAND WARMER SCOTTY DOG DESIGN        1 03/12/10 11:35  2.10
## 5628   536874     SET OF 36 TEATIME PAPER DOILIES        1 03/12/10 11:35  1.45
## 5631   536874   PAPER CHAIN KIT VINTAGE CHRISTMAS        1 03/12/10 11:35  2.95
## 5642   536874              JAM MAKING SET PRINTED        1 03/12/10 11:35  1.45
## 6320   536945            36 FOIL HEART CAKE CASES        1 03/12/10 12:24  2.10
## 6333   536945      PACK 3 FIRE ENGINE/CAR PATCHES        1 03/12/10 12:24  1.25
## 6355   536945    FUNKY WASHING UP GLOVES ASSORTED        1 03/12/10 12:24  2.10
## 6358   536945            ASSORTED CREEPY CRAWLIES       24 03/12/10 12:24  0.42
## 6623   536981  GREY FLORAL FELTCRAFT SHOULDER BAG        1 03/12/10 14:26  3.75
## 7300   537042     LOLITA  DESIGN  COTTON TOTE BAG        1 05/12/10 10:45  2.25
## 7302   537042     LOLITA  DESIGN  COTTON TOTE BAG        1 05/12/10 10:45  2.25
## 7326   537042     RECIPE BOX PANTRY YELLOW DESIGN        1 05/12/10 10:45  2.95
## 7358   537045   ROSE SCENT CANDLE IN JEWELLED BOX        1 05/12/10 10:54  4.25
## 7375   537045           HEART IVORY TRELLIS LARGE        1 05/12/10 10:54  1.65
## 7376   537045           HEART FILIGREE DOVE LARGE        1 05/12/10 10:54  1.65
## 7521   537051            ALARM CLOCK BAKELIKE RED        2 05/12/10 11:12  3.75
## 7523   537051          ALARM CLOCK BAKELIKE IVORY        1 05/12/10 11:12  3.75
## 7530   537051          ALARM CLOCK BAKELIKE IVORY        1 05/12/10 11:12  3.75
## 7531   537051                   S/4 CACTI CANDLES        1 05/12/10 11:12  4.95
## 7540   537051               CACTI T-LIGHT CANDLES       32 05/12/10 11:12  0.42
## 7675   537059                STRIPES DESIGN TEDDY        1 05/12/10 11:54  2.55
## 7840   537111                PIGGY BANK RETROSPOT        1 05/12/10 12:08  2.55
## 7960   537126         FELTCRAFT CUSHION BUTTERFLY        1 05/12/10 12:13  3.75
## 8056   537131           SET OF 6 T-LIGHTS SNOWMEN        6 05/12/10 12:26  2.95
## 8097   537133            RED RETROSPOT OVEN GLOVE        1 05/12/10 12:29  1.25
## 8115   537133            VINTAGE UNION JACK APRON        1 05/12/10 12:29  6.95
## 8117   537133                 RED RETROSPOT APRON        1 05/12/10 12:29  5.95
## 8118   537133        RED TEA TOWEL CLASSIC DESIGN        1 05/12/10 12:29  1.25
## 8119   537133   HOT WATER BOTTLE TEA AND SYMPATHY        1 05/12/10 12:29  3.95
## 8272   537136       TRADITIONAL CHRISTMAS RIBBONS        2 05/12/10 12:42  1.25
## 8276   537136          SET/6 COLLAGE PAPER PLATES        2 05/12/10 12:42  0.85
## 8280   537136                         WICKER STAR        1 05/12/10 12:42  2.10
## 8416   537140  ASS DES PHONE SPONGE CRAFT STICKER        1 05/12/10 12:53  0.65
## 8423   537140           HAND WARMER RED RETROSPOT        1 05/12/10 12:53  2.10
## 8424   537140              HAND WARMER UNION JACK        1 05/12/10 12:53  2.10
## 8526   537144      PAPER CHAIN KIT 50'S CHRISTMAS        1 05/12/10 13:00  2.95
## 8540   537144          HEART FILIGREE DOVE  SMALL        1 05/12/10 13:00  1.25
## 8556   537144                         SKULLS TAPE        1 05/12/10 13:00  0.65
## 8563   537144                         SKULLS TAPE        1 05/12/10 13:00  0.65
## 8564   537144              PLASTERS IN TIN SKULLS        1 05/12/10 13:00  1.65
## 8565   537144            PLASTERS IN TIN SPACEBOY        1 05/12/10 13:00  1.65
## 8569   537144            SKULLS SQUARE TISSUE BOX        1 05/12/10 13:00  1.25
## 8570   537144                LADS ONLY TISSUE BOX        1 05/12/10 13:00  1.25
## 8579   537144      PAPER CHAIN KIT 50'S CHRISTMAS        1 05/12/10 13:00  2.95
## 8630   537153      SMALL SILVER TRELLIS CANDLEPOT        6 05/12/10 13:03  2.95
## 8654   537154          WOODEN FRAME ANTIQUE WHITE        6 05/12/10 13:05  2.95
## 8656   537154   WOODEN PICTURE FRAME WHITE FINISH        6 05/12/10 13:05  2.55
## 8659   537154            ALARM CLOCK BAKELIKE RED        1 05/12/10 13:05  3.75
## 8661   537154            ALARM CLOCK BAKELIKE RED        1 05/12/10 13:05  3.75
## 8686   537154          POPPY'S PLAYHOUSE BATHROOM        1 05/12/10 13:05  2.10
## 8687   537154        POPPY'S PLAYHOUSE LIVINGROOM        1 05/12/10 13:05  2.10
## 8688   537154           POPPY'S PLAYHOUSE KITCHEN        1 05/12/10 13:05  2.10
## 8690   537154           POPPY'S PLAYHOUSE BEDROOM        1 05/12/10 13:05  2.10
## 8697   537154      JUMBO  BAG BAROQUE BLACK WHITE       10 05/12/10 13:05  1.95
## 8713   537155                         RAIN PONCHO        1 05/12/10 13:05  0.85
## 8715   537155                   POLKADOT RAIN HAT        1 05/12/10 13:05  0.42
## 8716   537155  ASS DES PHONE SPONGE CRAFT STICKER        1 05/12/10 13:05  0.65
## 8748   537156 WHITE SPOT BLUE CERAMIC DRAWER KNOB        6 05/12/10 13:08  1.25
## 8749   537156       BLUE SPOT CERAMIC DRAWER KNOB        6 05/12/10 13:08  1.25
## 8847   537176          OFFICE MUG WARMER POLKADOT        1 05/12/10 13:26  2.95
## 8904   537192       CREAM SLICE FLANNEL PINK SPOT        1 05/12/10 13:42  2.95
## 8909   537192           PACK OF 6 BIRDY GIFT TAGS        1 05/12/10 13:42  1.25
## 8921   537192             JUMBO BAG PINK POLKADOT        1 05/12/10 13:42  1.95
## 8928   537193  NOVELTY BISCUITS CAKE STAND 3 TIER        1 05/12/10 13:49  9.95
## 8940   537193               LOVE HEART NAPKIN BOX        4 05/12/10 13:49  4.25
## 8957   537193                TEA FOR ONE POLKADOT        1 05/12/10 13:49  4.25
## 8980   537195 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 05/12/10 13:55  1.25
## 9022   537196   CHRISTMAS HANGING HEART WITH BELL        1 05/12/10 13:55  1.25
## 9023   537196       SET OF 4 NAPKIN CHARMS 3 KEYS        1 05/12/10 13:55  2.55
## 9026   537196   CHRISTMAS HANGING HEART WITH BELL        1 05/12/10 13:55  1.25
## 9030   537196     BEADED CRYSTAL HEART PINK SMALL        1 05/12/10 13:55  1.25
## 9037   537196              TEA TIME KITCHEN APRON        1 05/12/10 13:55  5.95
## 9043   537196   SET 20 NAPKINS FAIRY CAKES DESIGN        1 05/12/10 13:55  0.85
## 9051   537196  OVERNIGHT BAG VINTAGE ROSE PAISLEY        1 05/12/10 13:55  4.95
## 9054   537196            FELTCRAFT CUSHION RABBIT        1 05/12/10 13:55  3.75
## 9064   537196                  MAN FLU METAL SIGN        1 05/12/10 13:55  2.10
## 9082   537196           ENAMEL WATERING CAN CREAM        1 05/12/10 13:55  4.95
## 9119   537199         60 TEATIME FAIRY CAKE CASES        1 05/12/10 14:06  0.55
## 9124   537199        HEART DECORATION WITH PEARLS        1 05/12/10 14:06  0.85
## 9127   537199        REX CASH+CARRY JUMBO SHOPPER        1 05/12/10 14:06  0.95
## 9137   537199       FRAPPUCINO SCARF KNITTING KIT        1 05/12/10 14:06  2.95
## 9150   537200   TRADITIONAL WOODEN CATCH CUP GAME        1 05/12/10 14:17  1.25
## 9259   537202          FELTCRAFT BUTTERFLY HEARTS        1 05/12/10 14:25  1.45
## 9268   537202                FELTCRAFT DOLL EMILY        1 05/12/10 14:25  2.95
## 9272   537202        FELTCRAFT PRINCESS LOLA DOLL        1 05/12/10 14:25  3.75
## 9280   537202         6 RIBBONS ELEGANT CHRISTMAS        1 05/12/10 14:25  1.65
## 9285   537202          FELTCRAFT BUTTERFLY HEARTS        2 05/12/10 14:25  1.45
## 9361   537208      DIAMANTE BOW BROOCH RED COLOUR        1 05/12/10 15:12  6.35
## 9388   537208              36 PENCILS TUBE SKULLS        2 05/12/10 15:12  1.25
## 9409   537208               CHRISTMAS TOILET ROLL        1 05/12/10 15:12  1.25
## 9418   537208   GROW YOUR OWN BASIL IN ENAMEL MUG        1 05/12/10 15:12  2.10
## 9419   537208        REX CASH+CARRY JUMBO SHOPPER        1 05/12/10 15:12  0.95
## 9421   537208    DIAMANTE BOW BROOCH BLACK COLOUR        1 05/12/10 15:12  6.35
## 9422   537208      DIAMANTE BOW BROOCH RED COLOUR        1 05/12/10 15:12  6.35
## 9481   537210              HAND WARMER UNION JACK        1 05/12/10 15:15  2.10
## 9691   537222   AIRLINE BAG VINTAGE JET SET BROWN        1 05/12/10 16:00  4.25
## 9708   537224           HI TEC ALPINE HAND WARMER        1 05/12/10 16:24  1.65
## 9720   537224            LOVE HEART POCKET WARMER        1 05/12/10 16:24  1.65
## 9725   537224             DOLLY HONEYCOMB GARLAND        1 05/12/10 16:24  1.65
## 9731   537224           HI TEC ALPINE HAND WARMER        1 05/12/10 16:24  1.65
## 9732   537224      PAPER CHAIN KIT 50'S CHRISTMAS        1 05/12/10 16:24  2.95
## 9743   537224           HI TEC ALPINE HAND WARMER        1 05/12/10 16:24  1.65
## 9762   537224           HI TEC ALPINE HAND WARMER        1 05/12/10 16:24  1.65
## 9795   537224  WHITE BELL HONEYCOMB PAPER GARLAND        2 05/12/10 16:24  1.65
## 9821   537224                 KEY FOB , BACK DOOR        1 05/12/10 16:24  0.65
## 9825   537224                  SOAP DISH BROCANTE        1 05/12/10 16:24  2.95
## 9828   537224       HAND WARMER SCOTTY DOG DESIGN        1 05/12/10 16:24  2.10
## 9830   537224      PAPER CHAIN KIT 50'S CHRISTMAS        1 05/12/10 16:24  2.95
## 9831   537224 ROTATING SILVER ANGELS T-LIGHT HLDR        2 05/12/10 16:24  2.55
## 9852   537224     CHRISTMAS TREE HEART DECORATION        3 05/12/10 16:24  0.42
## 9857   537224   GLITTER CHRISTMAS TREE WITH BELLS        6 05/12/10 16:24  1.95
## 9866   537224      CHRISTMAS CRAFT TREE TOP ANGEL        1 05/12/10 16:24  2.10
## 9870   537224               BLUE KNITTED EGG COSY        1 05/12/10 16:24  1.95
## 9888   537225               RED DAISY POCKET BOOK        6 05/12/10 16:41  0.85
## 11089  537240      METAL SIGN,CUPCAKE SINGLE HOOK        1 06/12/10 10:08  2.51
## 11368  537254  WOODEN STAR CHRISTMAS SCANDINAVIAN        1 06/12/10 11:01  0.85
## 11377  537254          FELTCRAFT 6 FLOWER FRIENDS        2 06/12/10 11:01  2.10
## 11445  537262       FRENCH BLUE METAL DOOR SIGN 5        2 06/12/10 11:26  1.25
## 11459  537262  3 HEARTS HANGING DECORATION RUSTIC        8 06/12/10 11:26  2.95
## 11492  537265    VINTAGE CREAM DOG FOOD CONTAINER        1 06/12/10 11:26  8.50
## 11515  537265         GIN + TONIC DIET METAL SIGN        1 06/12/10 11:26  2.10
## 11517  537265           FANCY FONT BIRTHDAY CARD,       12 06/12/10 11:26  0.42
## 11518  537265            JAM MAKING SET WITH JARS        1 06/12/10 11:26  4.25
## 11519  537265      METAL SIGN TAKE IT OR LEAVE IT        1 06/12/10 11:26  2.95
## 11523  537265                  MOROCCAN TEA GLASS       12 06/12/10 11:26  0.85
## 11524  537265                  MOROCCAN TEA GLASS       12 06/12/10 11:26  0.85
## 11526  537265   DO NOT TOUCH MY STUFF DOOR HANGER        1 06/12/10 11:26  1.45
## 11527  537265   DO NOT TOUCH MY STUFF DOOR HANGER        1 06/12/10 11:26  1.45
## 11531  537265                  BLUE POLKADOT WRAP       25 06/12/10 11:26  0.42
## 11721  537351           PACK OF 12 STICKY BUNNIES        2 06/12/10 12:23  0.65
## 11723  537351              POCKET MIRROR WOODLAND        1 06/12/10 12:23  1.25
## 11727  537351                    PARTY METAL SIGN        1 06/12/10 12:23  1.45
## 11820  537362    PLASTERS IN TIN WOODLAND ANIMALS        1 06/12/10 12:34  1.65
## 11884  537369   ASSORTED TUTTI FRUTTI LARGE PURSE        1 06/12/10 12:41  2.10
## 11889  537369     SMALL HAMMERED SILVER CANDLEPOT        6 06/12/10 12:41  2.95
## 11910  537369     BLUE POLKADOT WASHING UP GLOVES        1 06/12/10 12:41  2.10
## 11919  537369        RETROSPOT GIANT TUBE MATCHES        1 06/12/10 12:41  2.55
## 11923  537369      RAINBOW PEGS PHOTO CLIP STRING        1 06/12/10 12:41  0.65
## 11928  537369                LADS ONLY TISSUE BOX        1 06/12/10 12:41  1.25
## 12064  537374     SMOKEY GREY COLOUR D.O.F. GLASS        4 06/12/10 12:55  0.65
## 12077  537374            CHILDRENS DOLLY GIRL MUG        1 06/12/10 12:55  1.65
## 12081  537374       COSY SLIPPER SHOES SMALL  RED        1 06/12/10 12:55  2.95
## 12092  537374                    PICTURE DOMINOES        1 06/12/10 12:55  1.45
## 12106  537374                CARD MOTORBIKE SANTA       12 06/12/10 12:55  0.42
## 12249  537382         SMALL RED BABUSHKA NOTEBOOK        1 06/12/10 13:13  0.85
## 12255  537382  FOLKART STAR CHRISTMAS DECORATIONS        1 06/12/10 13:13  1.25
## 12260  537382             GLITTER CHRISTMAS HEART        2 06/12/10 13:13  0.85
## 12262  537382   CHRISTMAS HANGING HEART WITH BELL        1 06/12/10 13:13  1.25
## 12472  537395     60 CAKE CASES VINTAGE CHRISTMAS        1 06/12/10 14:05  0.55
## 12498  537395    I CAN ONLY PLEASE ONE PERSON MUG        2 06/12/10 14:05  1.25
## 12501  537395           HAND WARMER RED RETROSPOT        1 06/12/10 14:05  2.10
## 12506  537395             LUNCH BOX I LOVE LONDON        1 06/12/10 14:05  1.95
## 12589  537399             CARD PSYCHEDELIC APPLES       12 06/12/10 14:31  0.42
## 12591  537399                   CARD CAT AND TREE       12 06/12/10 14:31  0.42
## 12603  537399        COFFEE MUG CAT + BIRD DESIGN        6 06/12/10 14:31  2.55
## 12795  537418              HAND WARMER UNION JACK        1 06/12/10 15:13  2.10
## 12849  537421           PACK OF 6 BIRDY GIFT TAGS        1 06/12/10 15:25  1.25
## 12880  537421               FELTCRAFT CUSHION OWL        1 06/12/10 15:25  3.75
## 12895  537422        T-LIGHT GLASS FLUTED ANTIQUE       12 06/12/10 15:27  1.25
## 12897  537422   VANILLA SCENT CANDLE JEWELLED BOX        1 06/12/10 15:27  4.25
## 12899  537422           PACK OF 6 BIRDY GIFT TAGS        2 06/12/10 15:27  1.25
## 12913  537422           PACK OF 6 BIRDY GIFT TAGS        2 06/12/10 15:27  1.25
## 13712  537441   HOT WATER BOTTLE TEA AND SYMPATHY        1 06/12/10 17:26  3.95
## 14063  537534           CHILDS GARDEN TROWEL BLUE        1 07/12/10 11:48  0.00
## 14113  537567     SET 12 RETRO WHITE CHALK STICKS        1 07/12/10 11:59  0.42
## 14195  537595                BLACK KITCHEN SCALES        1 07/12/10 12:29  8.50
## 14559  537624            ASSORTED CREEPY CRAWLIES       24 07/12/10 14:41  0.42
## 14608  537624              DINOSAURS  WRITING SET        1 07/12/10 14:41  1.65
## 15929  537646         CHICK GREY HOT WATER BOTTLE        1 07/12/10 15:39  3.45
## 15930  537646             CREAM HEART CARD HOLDER        1 07/12/10 15:39  3.95
## 15931  537646               PACK/12 XMAS FUN CARD        1 07/12/10 15:39  2.95
## 15937  537646         CHICK GREY HOT WATER BOTTLE        1 07/12/10 15:39  3.45
## 15948  537646        REX CASH+CARRY JUMBO SHOPPER        1 07/12/10 15:39  0.95
## 15957  537646           PACK OF 6 BIRDY GIFT TAGS        1 07/12/10 15:39  1.25
## 15958  537646           PACK OF 6 BIRDY GIFT TAGS        1 07/12/10 15:39  1.25
## 15969  537646      IVORY PILLAR CANDLE GOLD FLOCK        1 07/12/10 15:39  2.95
## 15981  537646         GIN + TONIC DIET METAL SIGN        1 07/12/10 15:39  2.10
## 16036  537653        WHITE STITCHED CUSHION COVER        2 07/12/10 15:54  6.95
## 16067  537653            ALARM CLOCK BAKELIKE RED        1 07/12/10 15:54  3.75
## 16068  537653                  PIZZA PLATE IN BOX        1 07/12/10 15:54  3.75
## 17237  537769        PLEASE ONE PERSON METAL SIGN        1 08/12/10 12:17  2.10
## 17240  537769              ALPHABET STENCIL CRAFT        1 08/12/10 12:17  1.25
## 17242  537769 SET/12 FUNKY FELT FLOWER PEG IN BAG        1 08/12/10 12:17  2.10
## 17249  537769         HAND WARMER BABUSHKA DESIGN        1 08/12/10 12:17  2.10
## 17320  537772               RIBBON REEL POLKADOTS        5 08/12/10 12:35  1.65
## 17327  537772             LUNCH BOX I LOVE LONDON        4 08/12/10 12:35  1.95
## 17333  537772          RIBBON REEL STRIPES DESIGN        5 08/12/10 12:35  1.65
## 17343  537772        AIRLINE BAG VINTAGE TOKYO 78        1 08/12/10 12:35  4.25
## 17391  537773    TRADITIONAL WOODEN SKIPPING ROPE        2 08/12/10 12:36  1.25
## 17414  537773          RIBBON REEL STRIPES DESIGN        5 08/12/10 12:36  1.65
## 17417  537773                 MINT KITCHEN SCALES        1 08/12/10 12:36  8.50
## 17516  537781              WOOD STAMP SET FLOWERS        1 08/12/10 12:46  1.65
## 17521  537781     SMALL HAMMERED SILVER CANDLEPOT        6 08/12/10 12:46  2.95
## 17556  537781                 HAPPY STENCIL CRAFT        1 08/12/10 12:46  1.25
## 17560  537781             HAND WARMER BIRD DESIGN        2 08/12/10 12:46  2.10
## 17566  537781     HOT WATER BOTTLE I AM SO POORLY        1 08/12/10 12:46  4.65
## 17572  537781           POPPY'S PLAYHOUSE BEDROOM        1 08/12/10 12:46  2.10
## 17579  537781            VINTAGE UNION JACK APRON        1 08/12/10 12:46  6.95
## 17590  537781               CHRISTMAS TOILET ROLL        1 08/12/10 12:46  1.25
## 17592  537781    IVORY PILLAR CANDLE SILVER FLOCK        1 08/12/10 12:46  2.95
## 17597  537781       CHILDRENS APRON APPLES DESIGN        1 08/12/10 12:46  1.95
## 17598  537781        PAINTED METAL PEARS ASSORTED        8 08/12/10 12:46  1.69
## 17599  537781    PLASTERS IN TIN WOODLAND ANIMALS        1 08/12/10 12:46  1.65
## 17606  537781           POPPY'S PLAYHOUSE BEDROOM        1 08/12/10 12:46  2.10
## 17607  537781        POPPY'S PLAYHOUSE LIVINGROOM        1 08/12/10 12:46  2.10
## 17616  537781               BALLOONS  WRITING SET        1 08/12/10 12:46  1.65
## 17618  537781       CHILDRENS APRON APPLES DESIGN        1 08/12/10 12:46  1.95
## 17622  537781    FUNKY WASHING UP GLOVES ASSORTED        1 08/12/10 12:46  2.10
## 17624  537781       ASSORTED COLOUR BIRD ORNAMENT        8 08/12/10 12:46  1.69
## 17625  537781      PACK OF 6 PANNETONE GIFT BOXES        1 08/12/10 12:46  2.55
## 17626  537781        SET OF 3 NOTEBOOKS IN PARCEL        1 08/12/10 12:46  1.65
## 17630  537781       PACK OF 20 NAPKINS RED APPLES        1 08/12/10 12:46  0.85
## 17632  537781      PAPER CHAIN KIT 50'S CHRISTMAS        1 08/12/10 12:46  2.95
## 17633  537781      ANTIQUE GLASS HEART DECORATION        1 08/12/10 12:46  1.95
## 17634  537781 4 IVORY DINNER CANDLES SILVER FLOCK        1 08/12/10 12:46  2.55
## 17636  537781               CHRISTMAS TOILET ROLL        1 08/12/10 12:46  1.25
## 17665  537792                 HERB MARKER PARSLEY        1 08/12/10 12:56  0.65
## 17669  537792    ASSORTED COLOUR SUCTION CUP HOOK        2 08/12/10 12:56  0.19
## 18086  537823      METAL SIGN,CUPCAKE SINGLE HOOK        1 08/12/10 14:25  2.51
## 18792  537842        4 PINK FLOCK CHRISTMAS BALLS        1 08/12/10 15:12  1.25
## 19548  537955           LUNCH BAG SPACEBOY DESIGN        1 09/12/10 11:28  1.65
## 19557  537955             RECYCLING BAG RETROSPOT        1 09/12/10 11:28  2.10
## 19558  537955                   TOY TIDY SPACEBOY        1 09/12/10 11:28  2.10
## 19560  537955             LUNCH BAG RED RETROSPOT        1 09/12/10 11:28  1.65
## 19729  538013     ANGEL DECORATION STARS ON DRESS       12 09/12/10 12:37  0.42
## 19848  538035                 LUNCH BAG CARS BLUE        3 09/12/10 13:03  1.65
## 19946  538051             LUNCH BOX I LOVE LONDON        2 09/12/10 13:24  1.95
## 20718  538071      METAL SIGN,CUPCAKE SINGLE HOOK        1 09/12/10 14:09  2.51
## 21693  538155           I'M ON HOLIDAY METAL SIGN        1 09/12/10 16:52  2.10
## 21815  538166               RED  HARMONICA IN BOX        5 09/12/10 18:09  1.25
## 21862  538168   RIBBON REEL CHRISTMAS SOCK BAUBLE        5 09/12/10 19:23  1.65
## 22026  538174  ROUND SNACK BOXES SET OF4 WOODLAND       12  10/12/10 9:35  2.95
## 22610  538182   ASS COL SMALL SAND GECKO P'WEIGHT        2 10/12/10 10:18  0.42
## 22886  538200        REX CASH+CARRY JUMBO SHOPPER        1 10/12/10 11:11  0.95
## 22913  538201                   TRAVEL SEWING KIT        1 10/12/10 11:12  1.65
## 22919  538201   HAIRCLIPS FORTIES FABRIC ASSORTED       12 10/12/10 11:12  0.65
## 22937  538201      PAPER CHAIN KIT 50'S CHRISTMAS        1 10/12/10 11:12  2.95
## 22956  538202     ANGEL DECORATION STARS ON DRESS       48 10/12/10 11:19  0.42
## 23017  538205  CHOCOLATE 3 WICK MORRIS BOX CANDLE        1 10/12/10 11:24  4.25
## 23018  538205 GARDENIA 3 WICK MORRIS BOXED CANDLE        1 10/12/10 11:24  4.25
## 23065  538207        SMALL MARSHMALLOWS PINK BOWL        1 10/12/10 11:33  1.25
## 23421  538307   PAPER CHAIN KIT VINTAGE CHRISTMAS        2 10/12/10 13:27  2.95
## 23469  538312           RIBBON REEL SNOWY VILLAGE        5 10/12/10 13:48  1.65
## 23483  538312   RIBBON REEL CHRISTMAS SOCK BAUBLE        5 10/12/10 13:48  1.65
## 23522  538313          ALARM CLOCK BAKELIKE IVORY        1 10/12/10 13:50  3.75
## 23524  538313      ALARM CLOCK BAKELIKE CHOCOLATE        1 10/12/10 13:50  3.75
## 23525  538313          ALARM CLOCK BAKELIKE GREEN        1 10/12/10 13:50  3.75
## 23526  538313      ALARM CLOCK BAKELIKE CHOCOLATE        1 10/12/10 13:50  3.75
## 23527  538313          ALARM CLOCK BAKELIKE IVORY        1 10/12/10 13:50  3.75
## 23528  538313            ALARM CLOCK BAKELIKE RED        2 10/12/10 13:50  3.75
## 23531  538313            ALARM CLOCK BAKELIKE RED        1 10/12/10 13:50  3.75
## 23537  538313     CIRCUS PARADE CHILDRENS EGG CUP       12 10/12/10 13:50  1.25
## 23541  538313     CIRCUS PARADE CHILDRENS EGG CUP       12 10/12/10 13:50  1.25
## 24637  538365            LOVE BUILDING BLOCK WORD        2 12/12/10 10:11  5.95
## 24695  538368         HAND WARMER BABUSHKA DESIGN        1 12/12/10 10:57  2.10
## 24721  538368       12 PENCIL SMALL TUBE WOODLAND        1 12/12/10 10:57  0.65
## 24724  538368        LARGE HEART MEASURING SPOONS        1 12/12/10 10:57  1.65
## 24731  538368        SET OF 3 NOTEBOOKS IN PARCEL        1 12/12/10 10:57  1.65
## 24774  538369          CHRISTMAS LIGHTS 10 SANTAS        1 12/12/10 11:06  8.50
## 24787  538369    RETROSPOT HEART HOT WATER BOTTLE        1 12/12/10 11:06  4.95
## 24885  538371       ENGLISH ROSE HOT WATER BOTTLE        1 12/12/10 11:07  4.25
## 24887  538371         GREY HEART HOT WATER BOTTLE        1 12/12/10 11:07  3.75
## 24888  538371         GREY HEART HOT WATER BOTTLE        1 12/12/10 11:07  3.75
## 24889  538371    SET 3 RETROSPOT TEA,COFFEE,SUGAR        1 12/12/10 11:07  4.95
## 24925  538374              LUNCH BAG SUKI  DESIGN        2 12/12/10 11:17  1.65
## 24989  538379       GINGERBREAD MAN COOKIE CUTTER        1 12/12/10 11:26  1.25
## 25004  538379                 HERB MARKER PARSLEY        1 12/12/10 11:26  0.65
## 25005  538379                HERB MARKER ROSEMARY        1 12/12/10 11:26  0.65
## 25006  538379                   HERB MARKER THYME        1 12/12/10 11:26  0.65
## 25007  538379                    HERB MARKER MINT        1 12/12/10 11:26  0.65
## 25008  538379                   HERB MARKER BASIL        1 12/12/10 11:26  0.65
## 25009  538379                  HERB MARKER CHIVES        1 12/12/10 11:26  0.65
## 25015  538379            JAM MAKING SET WITH JARS        1 12/12/10 11:26  4.25
## 25018  538379       GINGERBREAD MAN COOKIE CUTTER        1 12/12/10 11:26  1.25
## 25203  538418  SET/3 OCEAN SCENT CANDLE JEWEL BOX        1 12/12/10 12:00  4.25
## 25223  538419       WOODEN HAPPY BIRTHDAY GARLAND        1 12/12/10 12:01  2.95
## 25243  538419     PACK OF 12 PINK PAISLEY TISSUES        2 12/12/10 12:01  0.29
## 25245  538419         PACK OF 12 WOODLAND TISSUES        1 12/12/10 12:01  0.29
## 25269  538421          ALARM CLOCK BAKELIKE GREEN        1 12/12/10 12:08  3.75
## 25340  538449     AIRLINE BAG VINTAGE JET SET RED        1 12/12/10 12:24  4.25
## 25429  538488   JUMBO SHOPPER VINTAGE RED PAISLEY        1 12/12/10 12:41  1.95
## 25491  538504     ANTIQUE SILVER TEA GLASS ETCHED        6 12/12/10 13:01  1.25
## 25686  538509     PLASTERS IN TIN VINTAGE PAISLEY        1 12/12/10 13:37  1.65
## 25703  538510   RIBBON REEL CHRISTMAS SOCK BAUBLE        1 12/12/10 13:47  1.65
## 25707  538510    PACK 3 BOXES CHRISTMAS PANNETONE        1 12/12/10 13:47  1.95
## 25730  538510                 DOORMAT BLACK FLOCK        1 12/12/10 13:47  7.95
## 25817  538514            BATH BUILDING BLOCK WORD        1 12/12/10 14:27  5.95
## 25818  538514            BATH BUILDING BLOCK WORD        1 12/12/10 14:27  5.95
## 25819  538514            LOVE BUILDING BLOCK WORD        1 12/12/10 14:27  5.95
## 25820  538514            BATH BUILDING BLOCK WORD        1 12/12/10 14:27  5.95
## 25821  538514            LOVE BUILDING BLOCK WORD        1 12/12/10 14:27  5.95
## 25822  538514            BATH BUILDING BLOCK WORD        1 12/12/10 14:27  5.95
## 25823  538514            BATH BUILDING BLOCK WORD        1 12/12/10 14:27  5.95
## 25840  538514                      DOORMAT HEARTS        1 12/12/10 14:27  7.95
## 25887  538517         WOODEN SCHOOL COLOURING SET        2 12/12/10 16:05  1.65
## 25895  538517           FELTCRAFT CHRISTMAS FAIRY        1 12/12/10 16:05  4.25
## 25897  538517        FELTCRAFT PRINCESS LOLA DOLL        1 12/12/10 16:05  3.75
## 25900  538517            FELTCRAFT CUSHION RABBIT        1 12/12/10 16:05  3.75
## 25902  538517               FELTCRAFT CUSHION OWL        1 12/12/10 16:05  3.75
## 25904  538517               FELTCRAFT CUSHION OWL        1 12/12/10 16:05  3.75
## 25905  538517   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 12/12/10 16:05  3.75
## 25906  538517   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 12/12/10 16:05  3.75
## 25907  538517   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 12/12/10 16:05  3.75
## 25908  538517   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 12/12/10 16:05  3.75
## 25909  538517            FELTCRAFT CUSHION RABBIT        1 12/12/10 16:05  3.75
## 25958  538518     SET OF 4 ROSE BOTANICAL CANDLES        1 12/12/10 16:14  3.75
## 25985  538518         BLUE PATCH PURSE PINK HEART        2 12/12/10 16:14  1.65
## 25995  538518    GLITTER HEART GARLAND WITH BELLS        1 12/12/10 16:14  3.75
## 26040  538518        REX CASH+CARRY JUMBO SHOPPER        1 12/12/10 16:14  0.95
## 27359  538625          PICNIC BASKET WICKER SMALL        1 13/12/10 12:50  5.95
## 27366  538625          PICNIC BASKET WICKER SMALL        1 13/12/10 12:50  5.95
## 27376  538625   RIBBON REEL CHRISTMAS SOCK BAUBLE        5 13/12/10 12:50  1.65
## 27622  538634 CHRISTMAS LIGHTS 10 VINTAGE BAUBLES        5 13/12/10 13:28  4.95
## 27964  538652     SMALL MEDINA STAMPED METAL BOWL       12 13/12/10 15:12  0.85
## 27970  538652  RIDGED GLASS STORAGE JAR CREAM LID        1 13/12/10 15:12  3.75
## 28056  538656      CAMOUFLAGE EAR MUFF HEADPHONES        1 13/12/10 15:20  5.49
## 28405  538707       12 PENCILS TALL TUBE WOODLAND        1 14/12/10 10:38  0.85
## 28444  538709  CHARLIE+LOLA PINK HOT WATER BOTTLE        1 14/12/10 10:46  2.95
## 28459  538709        SET OF 3 NOTEBOOKS IN PARCEL        1 14/12/10 10:46  1.65
## 28564  538744  12 PENCILS TALL TUBE RED RETROSPOT        1 14/12/10 11:26  0.85
## 28588  538744   MAGIC DRAWING SLATE CIRCUS PARADE        1 14/12/10 11:26  0.42
## 28590  538744     60 CAKE CASES VINTAGE CHRISTMAS        2 14/12/10 11:26  0.55
## 28591  538744 SET OF 20 VINTAGE CHRISTMAS NAPKINS        2 14/12/10 11:26  0.85
## 28595  538744 KNITTED UNION FLAG HOT WATER BOTTLE        2 14/12/10 11:26  3.75
## 28596  538744        WHITE SKULL HOT WATER BOTTLE        1 14/12/10 11:26  3.75
## 28606  538744         GIN + TONIC DIET METAL SIGN        2 14/12/10 11:26  2.10
## 28874  538810       ENGLISH ROSE HOT WATER BOTTLE        1 14/12/10 12:18  4.25
## 28875  538810     PLASTERS IN TIN VINTAGE PAISLEY        1 14/12/10 12:18  1.65
## 28876  538810    PLASTERS IN TIN WOODLAND ANIMALS        1 14/12/10 12:18  1.65
## 28880  538810            BATH BUILDING BLOCK WORD        2 14/12/10 12:18  5.95
## 28987  538827      METAL SIGN,CUPCAKE SINGLE HOOK       20 14/12/10 12:59  0.42
## 29150  538839   VINTAGE CREAM 3 BASKET CAKE STAND        1 14/12/10 13:10  9.95
## 29166  538839   S/6 WOODEN SKITTLES IN COTTON BAG        1 14/12/10 13:10  2.95
## 29200  538843                          BUTTON BOX        1 14/12/10 13:18  1.95
## 29259  538849          FRENCH ENAMEL CANDLEHOLDER        1 14/12/10 13:31  2.10
## 29280  538849           RED RETROSPOT STORAGE JAR        1 14/12/10 13:31  3.75
## 29302  538849           RED RETROSPOT BUTTER DISH        1 14/12/10 13:31  4.95
## 29309  538849           RED RETROSPOT STORAGE JAR        1 14/12/10 13:31  3.75
## 29312  538849    RED RETROSPOT TRADITIONAL TEAPOT        1 14/12/10 13:31  7.95
## 29492  538857       RED TOADSTOOL LED NIGHT LIGHT        1 14/12/10 13:58  1.65
## 30545  538951                  SPACEBOY LUNCH BOX        1 15/12/10 11:26  1.95
## 30562  538951         TEA BAG PLATE RED RETROSPOT        1 15/12/10 11:26  0.85
## 30574  538951             LUNCH BAG PINK POLKADOT        1 15/12/10 11:26  1.65
## 31021  539019          FELTCRAFT 6 FLOWER FRIENDS        2 15/12/10 14:12  2.10
## 31022  539019            3 STRIPEY MICE FELTCRAFT        2 15/12/10 14:12  1.95
## 31044  539019    FUNKY WASHING UP GLOVES ASSORTED        2 15/12/10 14:12  2.10
## 31045  539019    FUNKY WASHING UP GLOVES ASSORTED        2 15/12/10 14:12  2.10
## 31118  539038      METAL SIGN,CUPCAKE SINGLE HOOK       20 15/12/10 14:45  0.42
## 31231  539041    ORIGAMI OPIUM INCENSE/CANDLE SET       24 15/12/10 15:34  0.50
## 31305  539044  NOVELTY BISCUITS CAKE STAND 3 TIER        2 15/12/10 15:47  9.95
## 31471  539053     6 CHOCOLATE LOVE HEART T-LIGHTS        1 15/12/10 16:32  2.10
## 31488  539053           HOT WATER BOTTLE BABUSHKA        1 15/12/10 16:32  4.65
## 31555  539075         SET/6 RED SPOTTY PAPER CUPS        1 15/12/10 17:28  0.65
## 31691  539092            REGENCY CAKESTAND 3 TIER       16 16/12/10 10:08 10.95
## 31925  539181    PACK OF 12 HEARTS DESIGN TISSUES       12 16/12/10 11:51  0.29
## 32371  539245     60 CAKE CASES DOLLY GIRL DESIGN        1 16/12/10 13:25  0.55
## 32848  539294  ORIGAMI LAVENDER INCENSE/CANDL SET        1 16/12/10 16:45  2.55
## 33048  539311      METAL SIGN,CUPCAKE SINGLE HOOK       40 16/12/10 17:53  0.42
## 33129  539317        GROW YOUR OWN HERBS SET OF 3        1 16/12/10 19:04  7.95
## 33134  539317       HEART DECORATION PAINTED ZINC        2 16/12/10 19:04  0.65
## 33136  539317        PENNY FARTHING BIRTHDAY CARD       12 16/12/10 19:04  0.42
## 33138  539317      BLUE SCANDINAVIAN PAISLEY WRAP       25 16/12/10 19:04  0.42
## 33142  539317               HEART OF WICKER LARGE        2 16/12/10 19:04  2.95
## 33149  539317             KEY CABINET MA CAMPAGNE        1 16/12/10 19:04  9.95
## 33184  539321     PINK HEART SHAPE EGG FRYING PAN        1 16/12/10 19:19  1.65
## 33186  539321               CHRISTMAS TOILET ROLL        2 16/12/10 19:19  1.25
## 33188  539321 GARDENIA 3 WICK MORRIS BOXED CANDLE        1 16/12/10 19:19  4.25
## 33193  539321      STRAWBERRY CERAMIC TRINKET BOX        1 16/12/10 19:19  1.25
## 33200  539321   JUMBO SHOPPER VINTAGE RED PAISLEY        1 16/12/10 19:19  1.95
## 33260  539324             RETROSPOT CANDLE  SMALL        1 16/12/10 19:51  1.69
## 33262  539324           RED RETROSPOT LUGGAGE TAG        1 16/12/10 19:51  1.25
## 33264  539324         60 TEATIME FAIRY CAKE CASES        1 16/12/10 19:51  0.55
## 33268  539324       MAGNETS PACK OF 4 RETRO PHOTO        1 16/12/10 19:51  1.25
## 33680  539419                  DOORMAT UNION FLAG       10 17/12/10 14:10  6.75
## 36248  539456                   TOOL BOX SOFT TOY        1 17/12/10 17:23  8.95
## 36254  539456           BLUE HEART COMPACT MIRROR        1 17/12/10 17:23  3.75
## 36320  539461      4 BURGUNDY WINE DINNER CANDLES       12 19/12/10 10:21  1.25
## 36495  539470       FILIGRIS HEART WITH BUTTERFLY        2 19/12/10 14:03  1.25
## 36504  539470      STRAWBERRY CERAMIC TRINKET BOX        1 19/12/10 14:03  1.25
## 36506  539470                TEA FOR ONE POLKADOT        1 19/12/10 14:03  4.25
## 36516  539470 CLASSIC METAL BIRDCAGE PLANT HOLDER        1 19/12/10 14:03 12.75
## 36520  539470 CLASSIC METAL BIRDCAGE PLANT HOLDER        1 19/12/10 14:03 12.75
## 36525  539471           FANCY FONT BIRTHDAY CARD,       12 19/12/10 14:16  0.42
## 36568  539472      ASSTD DESIGN 3D PAPER STICKERS        1 19/12/10 14:23  0.85
## 36577  539472        GROW YOUR OWN PLANT IN A CAN        1 19/12/10 14:23  1.25
## 36620  539475                SMALL POPCORN HOLDER        1 19/12/10 14:41  0.85
## 36627  539475             SILK PURSE BABUSHKA RED        1 19/12/10 14:41  3.35
## 36630  539475      SET OF 6 3D KIT CARDS FOR KIDS        1 19/12/10 14:41  0.85
## 36650  539475                FELTCRAFT DOLL EMILY        1 19/12/10 14:41  2.95
## 36654  539475          FELTCRAFT 6 FLOWER FRIENDS        1 19/12/10 14:41  2.10
## 36656  539475        FULL ENGLISH BREAKFAST PLATE        1 19/12/10 14:41  3.75
## 36753  539484        DOORMAT HOME SWEET HOME BLUE        1 19/12/10 15:44  7.95
## 36764  539484        CHRISTMAS LIGHTS 10 REINDEER        1 19/12/10 15:44  8.50
## 36790  539484       SET OF 3 HEART COOKIE CUTTERS       12 19/12/10 15:44  1.25
## 36794  539484        CHRISTMAS LIGHTS 10 REINDEER        1 19/12/10 15:44  8.50
## 36804  539484                    SOLDIERS EGG CUP       12 19/12/10 15:44  1.25
## 38343  539647           BOUDOIR SQUARE TISSUE BOX        1 20/12/10 16:08  1.25
## 38361  539647                      GLAMOROUS  MUG        1 20/12/10 16:08  1.25
## 38419  539653      METAL SIGN,CUPCAKE SINGLE HOOK       20 20/12/10 16:50  0.42
## 38437  539653         HAND WARMER BABUSHKA DESIGN       24 20/12/10 16:50  0.85
## 38532  539659           ALARM CLOCK BAKELIKE PINK        6  21/12/10 9:47  3.75
## 39052  539733               JAM JAR WITH PINK LID        2 21/12/10 15:13  0.85
## 39287  539737      METAL SIGN,CUPCAKE SINGLE HOOK        1 21/12/10 15:19  2.51
## 39565  539741      METAL SIGN,CUPCAKE SINGLE HOOK        1 21/12/10 15:20  2.51
## 40279  539856            CHILDS GARDEN BRUSH BLUE        1 22/12/10 14:41  0.00
## 40365  539933      METAL SIGN,CUPCAKE SINGLE HOOK        8 23/12/10 11:24  1.25
## 41008  539958       SET OF 4 FAIRY CAKE PLACEMATS        2 23/12/10 13:26  3.36
## 41176  539988      METAL SIGN,CUPCAKE SINGLE HOOK        1 23/12/10 16:06  1.25
## 41177  539988      METAL SIGN,CUPCAKE SINGLE HOOK        1 23/12/10 16:06  1.25
## 41203  539988    FUNKY WASHING UP GLOVES ASSORTED        2 23/12/10 16:06  2.10
## 41316  540005        REX CASH+CARRY JUMBO SHOPPER        1 04/01/11 10:38  0.95
## 41368  540014     HANGING SPRING FLOWER EGG LARGE        1 04/01/11 11:34  0.85
## 41562  540021          HOME SWEET HOME METAL SIGN        1 04/01/11 12:51  2.95
## 41596  540023      PACK OF 60 MUSHROOM CAKE CASES        1 04/01/11 12:58  0.55
## 41612  540023        200 RED + WHITE BENDY STRAWS        1 04/01/11 12:58  1.25
## 41614  540023           FRENCH WC SIGN BLUE METAL        1 04/01/11 12:58  1.25
## 42056  540027      METAL SIGN,CUPCAKE SINGLE HOOK       20 04/01/11 13:30  0.42
## 42199  540043          CHOCOLATE HOT WATER BOTTLE        1 04/01/11 14:21  4.95
## 42250  540093                 MIRRORED DISCO BALL        1 04/01/11 15:24  5.95
## 42370  540098             LUNCH BAG  BLACK SKULL.        1 04/01/11 15:50  1.65
## 42742  540154      METAL SIGN,CUPCAKE SINGLE HOOK        2 05/01/11 11:30  0.85
## 43446  540238      METAL SIGN,CUPCAKE SINGLE HOOK        1 05/01/11 14:44  0.85
## 43698  540247       SET OF 20 KIDS COOKIE CUTTERS        1 05/01/11 15:56  2.10
## 43757  540247            36 FOIL HEART CAKE CASES        1 05/01/11 15:56  2.10
## 45728  540373          ENAMEL MEASURING JUG CREAM        2 06/01/11 17:10  4.25
## 45742  540373            RETROSPOT LARGE MILK JUG        1 06/01/11 17:10  4.95
## 45748  540373          OFFICE MUG WARMER POLKADOT        1 06/01/11 17:10  2.95
## 47649  540499                IVORY KITCHEN SCALES        1 09/01/11 10:21  8.50
## 47651  540499                  RED KITCHEN SCALES        1 09/01/11 10:21  8.50
## 47668  540501      METAL SIGN,CUPCAKE SINGLE HOOK       20 09/01/11 10:43  0.42
## 47770  540506   SET OF 6 SPICE TINS PANTRY DESIGN        2 09/01/11 11:12  3.95
## 47819  540509       BALLOON WATER BOMB PACK OF 35       10 09/01/11 11:27  0.42
## 47878  540511       ASSORTED COLOUR BIRD ORNAMENT        8 09/01/11 11:34  1.69
## 47883  540511                LANTERN CREAM GAZEBO        1 09/01/11 11:34  4.95
## 47894  540511       WELCOME  WOODEN BLOCK LETTERS        1 09/01/11 11:34  9.95
## 47896  540511            LOVE BUILDING BLOCK WORD        1 09/01/11 11:34  5.95
## 47923  540512               HEART OF WICKER SMALL        1 09/01/11 11:39  1.65
## 47977  540514                  RED KITCHEN SCALES        1 09/01/11 11:43  8.50
## 47978  540514                IVORY KITCHEN SCALES        1 09/01/11 11:43  8.50
## 47979  540514                BLACK KITCHEN SCALES        1 09/01/11 11:43  8.50
## 48034  540516          JIGSAW TREE WITH BIRDHOUSE        1 09/01/11 12:01  1.45
## 48218  540524 COLOUR GLASS T-LIGHT HOLDER HANGING        8 09/01/11 12:53  0.65
## 48221  540524 COLOUR GLASS T-LIGHT HOLDER HANGING        8 09/01/11 12:53  0.65
## 48222  540524 COLOUR GLASS T-LIGHT HOLDER HANGING        8 09/01/11 12:53  0.65
## 48227  540524            BATH BUILDING BLOCK WORD        1 09/01/11 12:53  5.95
## 48228  540524            BATH BUILDING BLOCK WORD        1 09/01/11 12:53  5.95
## 48229  540524            BATH BUILDING BLOCK WORD        1 09/01/11 12:53  5.95
## 48230  540524            BATH BUILDING BLOCK WORD        1 09/01/11 12:53  5.95
## 48231  540524            BATH BUILDING BLOCK WORD        1 09/01/11 12:53  5.95
## 48233  540524    AGED GLASS SILVER T-LIGHT HOLDER       12 09/01/11 12:53  0.65
## 48636  540545       SET OF 3 HEART COOKIE CUTTERS        2 09/01/11 15:35  1.25
## 48646  540545                      RETROSPOT LAMP        4 09/01/11 15:35  9.95
## 49754  540646      METAL SIGN,CUPCAKE SINGLE HOOK        2 10/01/11 14:32  0.85
## 50129  540647   ANTIQUE SILVER TEA GLASS ENGRAVED        6 10/01/11 14:57  1.25
## 50182  540647                IVORY KITCHEN SCALES        1 10/01/11 14:57  8.50
## 50555  540681      METAL SIGN,CUPCAKE SINGLE HOOK        6 10/01/11 16:25  0.85
## 51110  540803    RETROSPOT HEART HOT WATER BOTTLE        1 11/01/11 12:30  4.95
## 51271  540816             LUNCH BOX I LOVE LONDON        6 11/01/11 12:55  1.95
## 51432  540821      METAL SIGN,CUPCAKE SINGLE HOOK        2 11/01/11 13:16  0.85
## 52029  540839                HEN HOUSE DECORATION        1 11/01/11 15:42  1.65
## 52039  540839  SET/10 BLUE POLKADOT PARTY CANDLES        1 11/01/11 15:42  1.25
## 52040  540839 SET/10 IVORY POLKADOT PARTY CANDLES        1 11/01/11 15:42  1.25
## 52058  540839            JAM MAKING SET WITH JARS        1 11/01/11 15:42  4.25
## 52917  540953     PACK OF 72 RETROSPOT CAKE CASES        1 12/01/11 13:16  0.55
## 52931  540953     CHILDRENS APRON SPACEBOY DESIGN        1 12/01/11 13:16  1.95
## 52932  540953           RETROSPOT CHILDRENS APRON        1 12/01/11 13:16  1.95
## 52934  540953   RETROSPOT PARTY BAG + STICKER SET        1 12/01/11 13:16  1.65
## 52945  540953      72 SWEETHEART FAIRY CAKE CASES        1 12/01/11 13:16  0.55
## 52950  540953      PACK OF 60 DINOSAUR CAKE CASES        1 12/01/11 13:16  0.55
## 52952  540953         60 TEATIME FAIRY CAKE CASES        1 12/01/11 13:16  0.55
## 52961  540953  WHITE HANGING HEART T-LIGHT HOLDER        1 12/01/11 13:16  2.95
## 52962  540953       SET OF 20 KIDS COOKIE CUTTERS        1 12/01/11 13:16  2.10
## 53503  540977      METAL SIGN,CUPCAKE SINGLE HOOK        3 12/01/11 15:01  0.85
## 53814  540992     GREEN REGENCY TEACUP AND SAUCER        1 12/01/11 16:57  2.95
## 53821  540992             RIBBON REEL LACE DESIGN        5 12/01/11 16:57  2.10
## 53825  540992     ROSES REGENCY TEACUP AND SAUCER        1 12/01/11 16:57  2.95
## 54509  541018          DOORMAT MULTICOLOUR STRIPE        1 13/01/11 12:03  7.95
## 54689  541094    POTTERING IN THE SHED METAL SIGN        2 13/01/11 13:36  1.95
## 54922  541104      METAL SIGN,CUPCAKE SINGLE HOOK        4 13/01/11 14:29  0.83
## 55818  541205           CHARLOTTE BAG SUKI DESIGN        1 14/01/11 12:23  0.85
## 55820  541205        ROUND CAKE TIN VINTAGE GREEN        1 14/01/11 12:23  7.95
## 55981  541213       ASSORTED COLOUR BIRD ORNAMENT        8 14/01/11 13:28  1.69
## 56742  541238               ROSE CARAVAN DOORSTOP        1 16/01/11 10:42  6.75
## 56759  541238   SET OF 6 SPICE TINS PANTRY DESIGN        1 16/01/11 10:42  3.95
## 56862  541244     ROSE 1 WICK MORRIS BOXED CANDLE        6 16/01/11 12:35  4.25
## 56880  541244         GREY HEART HOT WATER BOTTLE        1 16/01/11 12:35  3.75
## 56882  541244       ENGLISH ROSE HOT WATER BOTTLE        1 16/01/11 12:35  4.25
## 56894  541248                CHOCOLATE CALCULATOR        1 16/01/11 13:04  1.65
## 56901  541249      SET 2 TEA TOWELS I LOVE LONDON        1 16/01/11 13:18  2.95
## 56909  541249     CHARLOTTE BAG DOLLY GIRL DESIGN       10 16/01/11 13:18  0.85
## 56920  541250                  CARD I LOVE LONDON       12 16/01/11 13:19  0.42
## 56927  541251  DECORATION , WOBBLY RABBIT , METAL       12 16/01/11 13:25  1.65
## 56928  541251                HEN HOUSE DECORATION       12 16/01/11 13:25  1.65
## 56974  541253    PACK OF 20 NAPKINS PANTRY DESIGN        1 16/01/11 13:51  0.85
## 57054  541258  WOOD 2 DRAWER CABINET WHITE FINISH        2 16/01/11 15:30  5.95
## 57055  541258   WOOD S/3 CABINET ANT WHITE FINISH        2 16/01/11 15:30  7.95
## 57063  541259             LUNCH BAG  BLACK SKULL.       10 16/01/11 15:38  1.65
## 57072  541259        AIRLINE BAG VINTAGE TOKYO 78        1 16/01/11 15:38  4.25
## 57102  541260    RED RETROSPOT TEA CUP AND SAUCER        1 16/01/11 15:44  3.75
## 57110  541262         GARLAND WOODEN HAPPY EASTER        2 16/01/11 15:50  1.25
## 57136  541262      SET/6 PINK  BUTTERFLY T-LIGHTS        1 16/01/11 15:50  2.10
## 57163  541262            LOVE BUILDING BLOCK WORD        1 16/01/11 15:50  5.95
## 57224  541264      JUMBO BAG SCANDINAVIAN PAISLEY        2 16/01/11 16:10  1.95
## 57256  541265                  LUNCH BAG WOODLAND        1 16/01/11 16:23  1.65
## 57275  541265        PINK HEART SHAPE PHOTO FRAME        1 16/01/11 16:23  1.65
## 57312  541265  DECORATION , WOBBLY CHICKEN, METAL        1 16/01/11 16:23  1.65
## 57318  541265            PINK METAL CHICKEN HEART        1 16/01/11 16:23  1.49
## 57338  541266                    SOLDIERS EGG CUP       12 16/01/11 16:25  1.25
## 57340  541266            LOVE BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57341  541266            LOVE BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57342  541266            LOVE BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57343  541266            LOVE BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57344  541266            LOVE BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57355  541266            HOME BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57356  541266            HOME BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57357  541266            HOME BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57358  541266            HOME BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57359  541266            HOME BUILDING BLOCK WORD        1 16/01/11 16:25  5.95
## 57373  541266             20 DOLLY PEGS RETROSPOT        5 16/01/11 16:25  1.25
## 57374  541266      CLOTHES PEGS RETROSPOT PACK 24        6 16/01/11 16:25  1.49
## 57677  541280       SET OF 4 FAIRY CAKE PLACEMATS        4 17/01/11 11:57  3.75
## 57735  541282              ENAMEL BREAD BIN CREAM        1 17/01/11 12:31 12.75
## 57892  541291        PLEASE ONE PERSON METAL SIGN       12 17/01/11 13:25  2.10
## 58258  541414        PLEASE ONE PERSON METAL SIGN        1 17/01/11 16:14  2.10
## 58264  541414               NO SINGING METAL SIGN        1 17/01/11 16:14  2.10
## 58281  541414  SET/20 RED RETROSPOT PAPER NAPKINS        1 17/01/11 16:14  0.85
## 58285  541414            LOVE BUILDING BLOCK WORD        1 17/01/11 16:14  5.95
## 58286  541414        PACK OF 6 HANDBAG GIFT BOXES        1 17/01/11 16:14  2.55
## 58288  541414            BATH BUILDING BLOCK WORD        1 17/01/11 16:14  5.95
## 58289  541414            LOVE BUILDING BLOCK WORD        1 17/01/11 16:14  5.95
## 58290  541414            LOVE BUILDING BLOCK WORD        1 17/01/11 16:14  5.95
## 58295  541414        REX CASH+CARRY JUMBO SHOPPER        1 17/01/11 16:14  0.95
## 59054  541422      METAL SIGN,CUPCAKE SINGLE HOOK        2 17/01/11 17:48  0.83
## 60147  541485         UNION JACK FLAG LUGGAGE TAG        1 18/01/11 13:05  1.25
## 60264  541489      NATURAL SLATE HEART CHALKBOARD        6 18/01/11 13:38  2.95
## 60269  541489          GLASS HEART T-LIGHT HOLDER        3 18/01/11 13:38  0.85
## 60273  541489       SMALL GLASS HEART TRINKET POT        1 18/01/11 13:38  2.10
## 60406  541494      PACK OF 12 TRADITIONAL CRAYONS        1 18/01/11 14:38  0.42
## 60851  541504        RED RETROSPOT SMALL MILK JUG        1 18/01/11 15:37  2.55
## 61047  541511         GREY HEART HOT WATER BOTTLE        1 18/01/11 16:45  3.75
## 61510  541523          ALARM CLOCK BAKELIKE GREEN        1 19/01/11 10:09  3.75
## 61614  541552      PACK OF 60 DINOSAUR CAKE CASES        1 19/01/11 11:15  0.55
## 61616  541552      72 SWEETHEART FAIRY CAKE CASES        1 19/01/11 11:15  0.55
## 61826  541571                   PINK BABY BUNTING        5 19/01/11 12:38  2.95
## 61829  541571           ASSORTED EASTER GIFT TAGS        6 19/01/11 12:38  0.85
## 62526  541594        COLOURING PENCILS BROWN TUBE       20 19/01/11 15:30  0.42
## 62558  541595         GARLAND WOODEN HAPPY EASTER       12 19/01/11 16:08  1.25
## 62683  541602     WHITE JEWELLED HEART DECORATION        1 19/01/11 17:17  0.85
## 62693  541602    RETROSPOT HEART HOT WATER BOTTLE        1 19/01/11 17:17  4.95
## 62699  541602   SMALL ROUND CUT GLASS CANDLESTICK        2 19/01/11 17:17  4.95
## 62719  541604  SET/10 BLUE POLKADOT PARTY CANDLES        1 19/01/11 17:23  1.25
## 62725  541604  SET/10 PINK POLKADOT PARTY CANDLES        1 19/01/11 17:23  1.25
## 62753  541604             36 FOIL STAR CAKE CASES        1 19/01/11 17:23  2.10
## 63027  541660            DOORSTOP RETROSPOT HEART        2 20/01/11 12:20  3.75
## 63028  541660         GINGHAM HEART  DOORSTOP RED        2 20/01/11 12:20  4.25
## 63049  541660     CANDLEHOLDER PINK HANGING HEART        3 20/01/11 12:20  2.95
## 63050  541660  WHITE HANGING HEART T-LIGHT HOLDER        3 20/01/11 12:20  2.95
## 63058  541660          FRENCH ENAMEL CANDLEHOLDER        1 20/01/11 12:20  2.10
## 63063  541660             CREAM HEART CARD HOLDER        3 20/01/11 12:20  3.95
## 64059  541696      METAL SIGN,CUPCAKE SINGLE HOOK        4 20/01/11 18:08  0.83
## 64415  541712            FELT FARM ANIMAL CHICKEN        1 21/01/11 11:19  1.25
## 65741  541832                  SALLE DE BAIN HOOK        2 21/01/11 17:14  1.25
## 65776  541838     ANTIQUE SILVER TEA GLASS ETCHED        6 23/01/11 10:43  1.25
## 65779  541838         CREAM SWEETHEART MINI CHEST        2 23/01/11 10:43 12.75
## 65803  541838   T-LIGHT HOLDER SWEETHEART HANGING        4 23/01/11 10:43  1.95
## 65815  541839   S/6 WOODEN SKITTLES IN COTTON BAG        2 23/01/11 11:15  2.95
## 65893  541843      MINI PAINTED GARDEN DECORATION       12 23/01/11 12:08  0.85
## 66017  541845  METAL 4 HOOK HANGER FRENCH CHATEAU        1 23/01/11 12:41  2.95
## 66024  541845   TRADITIONAL WOODEN CATCH CUP GAME        1 23/01/11 12:41  1.25
## 66202  541848                       CHILLI LIGHTS        2 23/01/11 13:31  4.95
## 66235  541849         HANGING METAL HEART LANTERN        1 23/01/11 13:34  1.65
## 66237  541849    RED RETROSPOT TEA CUP AND SAUCER        1 23/01/11 13:34  3.75
## 66245  541849                 WHITE METAL LANTERN        1 23/01/11 13:34  3.75
## 66249  541849      72 SWEETHEART FAIRY CAKE CASES        1 23/01/11 13:34  0.55
## 66348  541854      LARGE PURPLE BABUSHKA NOTEBOOK        1 23/01/11 14:58  1.25
## 66406  541855             BOX OF 9 PEBBLE CANDLES        1 23/01/11 14:59  1.95
## 66419  541855       SET OF 6 HERB TINS SKETCHBOOK        1 23/01/11 14:59  3.95
## 66424  541855   HANGING HEART ZINC T-LIGHT HOLDER        2 23/01/11 14:59  0.85
## 66428  541855          HANGING METAL STAR LANTERN        1 23/01/11 14:59  1.65
## 66442  541855   GLASS JAR DAISY FRESH COTTON WOOL        1 23/01/11 14:59  2.95
## 67184  541886                      JUMBO BAG OWLS       10 24/01/11 11:21  1.95
## 67886  541975        MEASURING TAPE BABUSHKA PINK       24 24/01/11 14:24  2.95
## 67887  541975         MEASURING TAPE BABUSHKA RED       24 24/01/11 14:24  2.95
## 67888  541975          ASSORTED COLOUR MINI CASES        6 24/01/11 14:24  7.95
## 67889  541975    RED RETROSPOT CHILDRENS UMBRELLA        6 24/01/11 14:24  3.25
## 67961  541985      NATURAL SLATE HEART CHALKBOARD        1 24/01/11 15:52  2.95
## 67962  541985           CARD HOLDER GINGHAM HEART        2 24/01/11 15:52  2.55
## 68057  541987                RECIPE BOX RETROSPOT        1 24/01/11 16:05  2.95
## 68597  542057            VINTAGE UNION JACK APRON        1 25/01/11 11:57  6.95
## 68618  542057       SET OF 3 CAKE TINS SKETCHBOOK        1 25/01/11 11:57  4.95
## 69062  542106                  RED RETROSPOT BOWL       24 25/01/11 13:37  1.25
## 69082  542107     PACK OF 72 RETROSPOT CAKE CASES        1 25/01/11 13:38  0.55
## 69086  542107         BOX OF 24 COCKTAIL PARASOLS        1 25/01/11 13:38  0.42
## 69089  542107      PACK OF 60 SPACEBOY CAKE CASES        1 25/01/11 13:38  0.55
## 69090  542107     PACK OF 72 RETROSPOT CAKE CASES        1 25/01/11 13:38  0.55
## 69091  542107      72 SWEETHEART FAIRY CAKE CASES        1 25/01/11 13:38  0.55
## 69121  542107                  GLASS  BEURRE DISH        1 25/01/11 13:38  3.95
## 69144  542107              TOAST ITS - I LOVE YOU        1 25/01/11 13:38  1.25
## 69145  542107            RELAX LARGE WOOD LETTERS        1 25/01/11 13:38 15.95
## 69162  542107 WHITE SPOT BLUE CERAMIC DRAWER KNOB        6 25/01/11 13:38  1.25
## 69188  542107       BLUE SPOT CERAMIC DRAWER KNOB        6 25/01/11 13:38  1.25
## 69189  542107      RED STRIPE CERAMIC DRAWER KNOB        6 25/01/11 13:38  1.25
## 69190  542107  WHITE SPOT RED CERAMIC DRAWER KNOB        6 25/01/11 13:38  1.25
## 69191  542107        RED SPOT CERAMIC DRAWER KNOB        6 25/01/11 13:38  1.25
## 69192  542107            BATH BUILDING BLOCK WORD        1 25/01/11 13:38  5.95
## 69193  542107            LOVE BUILDING BLOCK WORD        1 25/01/11 13:38  5.95
## 69362  542112      HAND OVER THE CHOCOLATE   SIGN        1 25/01/11 13:55  2.10
## 69364  542112       LADIES & GENTLEMEN METAL SIGN        1 25/01/11 13:55  2.55
## 69396  542112 COLOUR GLASS T-LIGHT HOLDER HANGING        8 25/01/11 13:55  0.65
## 69850  542192       SET OF 3 HEART COOKIE CUTTERS        3 26/01/11 11:27  1.25
## 69911  542213                       PARTY BUNTING        1 26/01/11 12:15  4.65
## 70073  542224     VICTORIAN GLASS HANGING T-LIGHT        6 26/01/11 12:45  1.25
## 70074  542224     ORIGAMI ROSE INCENSE/CANDLE SET        1 26/01/11 12:45  2.55
## 70190  542231                DOLLY GIRL LUNCH BOX        1 26/01/11 13:40  1.95
## 70218  542231       SET OF 9 BLACK SKULL BALLOONS        1 26/01/11 13:40  0.85
## 70219  542231                BUTTERFLIES STICKERS        6 26/01/11 13:40  0.85
## 70234  542231       ALPHABET HEARTS STICKER SHEET        3 26/01/11 13:40  0.85
## 70236  542231            JAM MAKING SET WITH JARS        2 26/01/11 13:40  4.25
## 70241  542231       ASSORTED COLOUR BIRD ORNAMENT        8 26/01/11 13:40  1.69
## 70315  542236   SET OF 6 SPICE TINS PANTRY DESIGN        1 26/01/11 14:19  3.95
## 70392  542239             CREAM HEART CARD HOLDER        1 26/01/11 14:35  3.95
## 70396  542239         HANGING METAL HEART LANTERN        1 26/01/11 14:35  1.65
## 70401  542239  WHITE HANGING HEART T-LIGHT HOLDER        2 26/01/11 14:35  2.95
## 71318  542344      METAL SIGN,CUPCAKE SINGLE HOOK        1 27/01/11 11:30  2.46
## 71551  542360                 PHOTO FRAME CORNICE        4 27/01/11 12:40  2.95
## 71856  542393     RETROSPOT TEA SET CERAMIC 11 PC        1 27/01/11 15:02  4.95
## 71868  542393       SET OF 4 FAIRY CAKE PLACEMATS        1 27/01/11 15:02  3.75
## 71882  542393      YOU'RE CONFUSING ME METAL SIGN        1 27/01/11 15:02  1.69
## 71883  542393    RED HANGING HEART T-LIGHT HOLDER        1 27/01/11 15:02  2.95
## 71894  542393  SET/4 RED MINI ROSE CANDLE IN BOWL        1 27/01/11 15:02  1.65
## 71932  542398   T-LIGHT HOLDER SWEETHEART HANGING        4 27/01/11 15:36  1.95
## 71942  542398    SMALL WHITE/PINK ROSE ART FLOWER        6 27/01/11 15:36  1.25
## 71971  542398         HANGING METAL HEART LANTERN        6 27/01/11 15:36  1.65
## 71973  542398     SCENTED CANDLE IN DIGITALIS TIN        1 27/01/11 15:36  2.10
## 72043  542399                 PHOTO FRAME CORNICE        4 27/01/11 15:38  2.95
## 72070  542401                 HAPPY STENCIL CRAFT        1 27/01/11 15:51  1.25
## 72071  542401              MONSTERS STENCIL CRAFT        1 27/01/11 15:51  1.25
## 72084  542401              DINOSAURS  WRITING SET        1 27/01/11 15:51  1.65
## 72085  542401              MONSTERS STENCIL CRAFT        1 27/01/11 15:51  1.25
## 72095  542401         WOODEN SCHOOL COLOURING SET        1 27/01/11 15:51  1.65
## 72096  542401                 HAPPY STENCIL CRAFT        1 27/01/11 15:51  1.25
## 72195  542409       PACK OF 20 NAPKINS RED APPLES        2 27/01/11 16:30  0.85
## 72237  542419    PACK OF 20 NAPKINS PANTRY DESIGN        1 27/01/11 17:41  0.85
## 72248  542419    STRAWBERRY DREAM CHILDS UMBRELLA        1 27/01/11 17:41  3.25
## 72288  542420       SET OF 20 KIDS COOKIE CUTTERS        1 27/01/11 18:05  2.10
## 72309  542422          BREAD BIN DINER STYLE MINT        1 27/01/11 19:33 16.95
## 72316  542422    HANGING HEART JAR T-LIGHT HOLDER        6 27/01/11 19:33  1.25
## 72324  542422            DOORSTOP RETROSPOT HEART        1 27/01/11 19:33  3.75
## 73169  542578     BOYS VINTAGE TIN SEASIDE BUCKET        8 28/01/11 14:57  2.55
## 73191  542584     RED RETROSPOT OVEN GLOVE DOUBLE        2 28/01/11 15:21  2.95
## 73449  542602       ENGLISH ROSE HOT WATER BOTTLE        1 30/01/11 12:09  4.25
## 73534  542607       HEART DECORATION PAINTED ZINC        1 30/01/11 13:48  0.65
## 73541  542607  BAKING MOULD HEART WHITE CHOCOLATE        1 30/01/11 13:48  2.55
## 73549  542607        RED RETROSPOT SMALL MILK JUG        1 30/01/11 13:48  2.55
## 73550  542607          SLATE TILE NATURAL HANGING        2 30/01/11 13:48  1.65
## 73558  542607             HOME SMALL WOOD LETTERS        2 30/01/11 13:48  4.95
## 73586  542608               BLUE HARMONICA IN BOX        1 30/01/11 13:51  1.25
## 73605  542608          HEART FILIGREE DOVE  SMALL        2 30/01/11 13:51  1.25
## 73702  542611      72 SWEETHEART FAIRY CAKE CASES       24 30/01/11 14:13  0.55
## 73809  542617  FELTCRAFT HAIRBAND PINK AND PURPLE        1 30/01/11 15:48  0.85
## 73852  542617 EAU DE NILE HEART SHAPE PHOTO FRAME        2 30/01/11 15:48  1.65
## 73860  542617      HANGING CHICK CREAM DECORATION        1 30/01/11 15:48  1.45
## 73868  542617            SILVER  CANDLEPOT JARDIN        2 30/01/11 15:48  3.75
## 73877  542617           DAIRY MAID LARGE MILK JUG        1 30/01/11 15:48  4.95
## 73911  542618      CLOTHES PEGS RETROSPOT PACK 24        1 30/01/11 15:52  1.49
## 73932  542618               HEART OF WICKER SMALL        1 30/01/11 15:52  1.65
## 73973  542619                 PHOTO FRAME CORNICE        4 30/01/11 15:54  2.95
## 75159  542719      HANGING CHICK CREAM DECORATION        1 31/01/11 14:18  1.45
## 75197  542719          HEART FILIGREE DOVE  SMALL        1 31/01/11 14:18  1.25
## 75200  542719      HANGING CHICK GREEN DECORATION        1 31/01/11 14:18  1.45
## 75397  542737   ANTIQUE SILVER TEA GLASS ENGRAVED        6 31/01/11 15:52  1.25
## 75833  542797         PACK OF 12 COLOURED PENCILS       12 01/02/11 11:08  0.85
## 76040  542862        RED SPOT CERAMIC DRAWER KNOB        1 01/02/11 11:51  1.25
## 76113  542867     FOOD CONTAINER SET 3 LOVE HEART        2 01/02/11 12:22  1.95
## 76247  542886           PACK OF 12 STICKY BUNNIES        1 01/02/11 13:09  0.65
## 76565  542898  MINI CAKE STAND WITH HANGING CAKES        1 01/02/11 14:01  1.45
## 76572  542898       SET OF 4 FAIRY CAKE PLACEMATS        1 01/02/11 14:01  3.75
## 76587  542898        SMALL HEART MEASURING SPOONS        1 01/02/11 14:01  0.85
## 76589  542898   BAKING MOULD HEART MILK CHOCOLATE        1 01/02/11 14:01  2.55
## 76623  542898     EASTER DECORATION SITTING BUNNY        1 01/02/11 14:01  0.85
## 77565  543006        REX CASH+CARRY JUMBO SHOPPER        1 02/02/11 12:53  0.95
## 77911  543022     6 CHOCOLATE LOVE HEART T-LIGHTS        2 02/02/11 14:37  2.10
## 78017  543033        SMALL HEART MEASURING SPOONS        1 02/02/11 15:48  0.85
## 78025  543033    ASSORTED MONKEY SUCTION CUP HOOK        2 02/02/11 15:48  0.42
## 78057  543036     RETROSPOT TEA SET CERAMIC 11 PC        2 02/02/11 15:57  4.95
## 78125  543040                  KITCHEN METAL SIGN        1 02/02/11 17:06  0.55
## 78155  543040             MEDIUM PINK BUDDHA HEAD        1 02/02/11 17:06  2.95
## 78203  543040      PACK OF 60 DINOSAUR CAKE CASES        1 02/02/11 17:06  0.55
## 78250  543040      CLOTHES PEGS RETROSPOT PACK 24        1 02/02/11 17:06  1.49
## 78255  543040                  RED KITCHEN SCALES        1 02/02/11 17:06  8.50
## 78256  543040        200 RED + WHITE BENDY STRAWS        1 02/02/11 17:06  1.25
## 78267  543040      OFFICE MUG WARMER BLACK+SILVER        1 02/02/11 17:06  2.95
## 78279  543040        SKULL LUNCH BOX WITH CUTLERY        1 02/02/11 17:06  2.55
## 78301  543040                   GIN AND TONIC MUG        1 02/02/11 17:06  1.25
## 78304  543040    RED RETROSPOT TRADITIONAL TEAPOT        1 02/02/11 17:06  7.95
## 78306  543040                  GLASS  BEURRE DISH        1 02/02/11 17:06  3.95
## 78325  543040         12 PENCILS SMALL TUBE SKULL        1 02/02/11 17:06  0.65
## 78327  543040 12 PENCILS SMALL TUBE RED RETROSPOT        1 02/02/11 17:06  0.65
## 78339  543040     IVORY HANGING DECORATION  HEART        1 02/02/11 17:06  0.85
## 78341  543040         ZINC METAL HEART DECORATION        1 02/02/11 17:06  1.25
## 78537  543096        SET OF 3 NOTEBOOKS IN PARCEL        2 03/02/11 11:39  1.65
## 78794  543108      SET OF 9 HEART SHAPED BALLOONS        2 03/02/11 12:37  1.25
## 78832  543111                HOT BATHS METAL SIGN        1 03/02/11 12:44  2.10
## 79279  543165        RED RETROSPOT SUGAR JAM BOWL        1 03/02/11 19:58  2.55
## 79289  543165        LARGE HEART MEASURING SPOONS        1 03/02/11 19:58  1.65
## 79859  543191      PACK OF 20 SKULL PAPER NAPKINS        1 04/02/11 11:54  0.85
## 79860  543191  SET/20 RED RETROSPOT PAPER NAPKINS        1 04/02/11 11:54  0.85
## 79866  543191  FOLK FELT HANGING MULTICOL GARLAND        2 04/02/11 11:54  3.75
## 79871  543191             RECYCLING BAG RETROSPOT        1 04/02/11 11:54  2.10
## 80139  543235     IVORY HANGING DECORATION  HEART        2 04/02/11 13:30  0.85
## 80143  543235     WHITE JEWELLED HEART DECORATION        1 04/02/11 13:30  0.85
## 80168  543235           SWEETHEART WIRE WALL TIDY        1 04/02/11 13:30  9.95
## 80312  543245                   GUMBALL COAT RACK        1 04/02/11 14:08  2.55
## 80532  543273    ASSORTED COLOUR SUCTION CUP HOOK        1 06/02/11 11:29  0.19
## 80647  543277        REX CASH+CARRY JUMBO SHOPPER        2 06/02/11 14:33  0.95
## 80655  543277            RETROSPOT LARGE MILK JUG        1 06/02/11 14:33  4.95
## 80659  543277        REX CASH+CARRY JUMBO SHOPPER        1 06/02/11 14:33  0.95
## 80661  543277                       POTTERING MUG        6 06/02/11 14:33  1.25
## 80738  543281             WATERING CAN PINK BUNNY        1 06/02/11 15:34  1.95
## 80934  543300             DOORMAT WELCOME SUNRISE        1 07/02/11 11:42  7.95
## 81030  543300        COFFEE MUG CAT + BIRD DESIGN        6 07/02/11 11:42  2.55
## 81075  543306                 HAPPY STENCIL CRAFT        2 07/02/11 11:56  1.25
## 81109  543306              MINI JIGSAW DOLLY GIRL        1 07/02/11 11:56  0.42
## 81110  543306             MINI JIGSAW BAKE A CAKE        1 07/02/11 11:56  0.42
## 81114  543306                   6 ROCKET BALLOONS        1 07/02/11 11:56  0.65
## 81197  543309    FUNKY WASHING UP GLOVES ASSORTED        1 07/02/11 12:05  2.10
## 81205  543309           KEEP OUT BOYS DOOR HANGER        1 07/02/11 12:05  1.45
## 81215  543309    PINK BLUE FELT CRAFT TRINKET BOX        1 07/02/11 12:05  1.25
## 82007  543397            EIGHT PIECE DINOSAUR SET        1 08/02/11 10:32  1.25
## 82016  543397                     ANIMAL STICKERS       24 08/02/11 10:32  0.21
## 83057  543474       SMALL GLASS HEART TRINKET POT        4 08/02/11 15:09  2.10
## 83629  543535           ROSE COTTAGE KEEPSAKE BOX        1 09/02/11 13:37  9.95
## 83964  543546      METAL SIGN,CUPCAKE SINGLE HOOK        1 09/02/11 16:52  2.46
## 84324  543600           RED RETROSPOT BUTTER DISH        2 10/02/11 13:19  4.95
## 84534  543630      12 RED ROSE PEG PLACE SETTINGS        1 10/02/11 16:01  1.25
## 84569  543631          ENVELOPE 50 CURIOUS IMAGES        1 10/02/11 16:17  0.85
## 84611  543631        RED RETROSPOT SMALL MILK JUG        2 10/02/11 16:17  2.55
## 84612  543631       DAIRY MAID TRADITIONAL TEAPOT        1 10/02/11 16:17  6.95
## 84620  543639        RED RETROSPOT SUGAR JAM BOWL        1 10/02/11 16:52  2.55
## 84637  543639    SET 3 RETROSPOT TEA,COFFEE,SUGAR        1 10/02/11 16:52  4.95
## 84651  543641 CERAMIC HEART FAIRY CAKE MONEY BANK        4 10/02/11 17:19  1.45
## 84652  543641  CERAMIC STRAWBERRY CAKE MONEY BANK        4 10/02/11 17:19  1.45
## 84848  543653                          PHOTO CUBE        1 11/02/11 10:26  1.65
## 85211  543731           EDWARDIAN PARASOL NATURAL        3 11/02/11 11:57  5.95
## 85633  543800      PACK OF 60 DINOSAUR CAKE CASES        1 13/02/11 11:36  0.55
## 85634  543800      HANGING CHICK GREEN DECORATION        1 13/02/11 11:36  1.45
## 85664  543800   SET OF 3 BUTTERFLY COOKIE CUTTERS        2 13/02/11 11:36  1.25
## 85671  543800     BLUE STRIPE CERAMIC DRAWER KNOB        6 13/02/11 11:36  1.25
## 85684  543800            HOME BUILDING BLOCK WORD        1 13/02/11 11:36  5.95
## 85781  543802   SET OF 6 SPICE TINS PANTRY DESIGN        1 13/02/11 12:03  3.95
## 85792  543803 SET 3 PAPER VINTAGE CHICK PAPER EGG        1 13/02/11 12:05  2.95
## 85865  543804     VICTORIAN GLASS HANGING T-LIGHT        6 13/02/11 12:17  1.25
## 85887  543805       GINGERBREAD MAN COOKIE CUTTER        1 13/02/11 12:41  1.25
## 86049  543812                  VINTAGE SNAP CARDS        1 13/02/11 14:40  0.85
## 86069  543812                RECIPE BOX RETROSPOT        1 13/02/11 14:40  2.95
## 86102  543814              PAPER CHAIN KIT EMPIRE        6 13/02/11 15:17  2.95
## 86129  543815                  POTTING SHED TWINE        2 13/02/11 15:18  2.10
## 86146  543816            PAPER BUNTING WHITE LACE        3 13/02/11 15:26  2.95
## 86606  543907     ANTIQUE SILVER TEA GLASS ETCHED        1 14/02/11 12:16  1.25
## 86611  543907   ENGLISH ROSE SMALL SCENTED FLOWER        2 14/02/11 12:16  0.85
## 86996  543973        CREAM FELT EASTER EGG BASKET        1 14/02/11 15:15  1.65
## 87683  544040     RECIPE BOX PANTRY YELLOW DESIGN        1 15/02/11 11:40  2.95
## 87697  544040          FELT EGG COSY WHITE RABBIT        1 15/02/11 11:40  0.85
## 87976  544068                GREEN POLKADOT PLATE        2 15/02/11 14:08  1.69
## 87977  544068   SET 20 NAPKINS FAIRY CAKES DESIGN        2 15/02/11 14:08  0.85
## 87987  544068                SMALL POPCORN HOLDER        2 15/02/11 14:08  0.85
## 87988  544068                   BLUE POLKADOT CUP        1 15/02/11 14:08  0.85
## 87990  544068                  PINK  POLKADOT CUP        2 15/02/11 14:08  0.85
## 88098  544077 SET 3 SONG BIRD PAPER EGGS ASSORTED        2 15/02/11 15:04  2.95
## 88560  544106      NATURAL SLATE HEART CHALKBOARD       12 16/02/11 10:47  2.95
## 88682  544112       CHOC TRUFFLE GOLD TRINKET POT        2 16/02/11 11:37  1.65
## 88685  544112           PINK DOUGHNUT TRINKET POT        2 16/02/11 11:37  1.65
## 88786  544151             BIRDHOUSE GARDEN MARKER        6 16/02/11 12:02  1.25
## 88803  544153                 WASHROOM METAL SIGN        2 16/02/11 12:11  1.45
## 89093  544177            HOME BUILDING BLOCK WORD        3 16/02/11 14:27  5.95
## 89116  544177 CLEAR DRAWER KNOB ACRYLIC EDWARDIAN       12 16/02/11 14:27  1.25
## 90332  544292              WOODLAND CHARLOTTE BAG       10 17/02/11 12:33  0.85
## 90393  544293           CHARLOTTE BAG SUKI DESIGN        1 17/02/11 12:42  0.85
## 90764  544311      METAL SIGN,CUPCAKE SINGLE HOOK        1 17/02/11 14:19  1.25
## 90766  544311      METAL SIGN,CUPCAKE SINGLE HOOK        1 17/02/11 14:19  1.25
## 91158  544336        EASTER TIN CHICKS PINK DAISY        1 17/02/11 19:36  1.65
## 91159  544336                 EASTER TIN KEEPSAKE        1 17/02/11 19:36  1.65
## 91167  544336    HANGING METAL CHICKEN DECORATION        2 17/02/11 19:36  1.25
## 91437  544368             CHILDS GARDEN RAKE PINK        3 18/02/11 11:27  2.10
## 91648  544406         POTTING SHED SEED ENVELOPES        3 18/02/11 13:26  1.25
## 91650  544406                 ROBOT BIRTHDAY CARD       12 18/02/11 13:26  0.42
## 91652  544406                  CARD I LOVE LONDON       12 18/02/11 13:26  0.42
## 91670  544406                  POTTING SHED TWINE        1 18/02/11 13:26  2.10
## 91688  544408                         WICKER STAR        1 18/02/11 13:29  2.10
## 92024  544444                  LUNCH BAG WOODLAND       10 20/02/11 10:51  1.65
## 92042  544445       BALLOON PUMP WITH 10 BALLOONS        1 20/02/11 10:56  1.95
## 92043  544445       BALLOON PUMP WITH 10 BALLOONS        1 20/02/11 10:56  1.95
## 92050  544445                   PINK OWL SOFT TOY        1 20/02/11 10:56  2.95
## 92100  544447          GREEN BIRDHOUSE DECORATION        3 20/02/11 11:39  0.85
## 92168  544450              TEA TIME KITCHEN APRON        1 20/02/11 12:23  5.95
## 92174  544450              TEA TIME KITCHEN APRON        1 20/02/11 12:23  5.95
## 92175  544450              TEA TIME KITCHEN APRON        1 20/02/11 12:23  5.95
## 92198  544450           ENAMEL WATERING CAN CREAM        1 20/02/11 12:23  4.95
## 92202  544450           ENAMEL WATERING CAN CREAM        1 20/02/11 12:23  4.95
## 92237  544450                  KIDS RAIN MAC PINK        1 20/02/11 12:23  0.85
## 92341  544455          FRENCH ENAMEL CANDLEHOLDER        1 20/02/11 13:18  2.10
## 92491  544461          RAINY LADIES BIRTHDAY CARD       12 20/02/11 14:08  0.42
## 92492  544461                EMPIRE BIRTHDAY CARD       12 20/02/11 14:08  0.42
## 92494  544461              SPACEBOY BIRTHDAY CARD       12 20/02/11 14:08  0.42
## 92495  544461                 ROBOT BIRTHDAY CARD       12 20/02/11 14:08  0.42
## 92496  544461             TEA PARTY BIRTHDAY CARD       12 20/02/11 14:08  0.42
## 92497  544461         RING OF ROSES BIRTHDAY CARD       12 20/02/11 14:08  0.42
## 92510  544461                   GUMBALL COAT RACK       12 20/02/11 14:08  2.55
## 92525  544461        RED SPOT CERAMIC DRAWER KNOB        6 20/02/11 14:08  1.25
## 92526  544461  WHITE SPOT RED CERAMIC DRAWER KNOB        6 20/02/11 14:08  1.25
## 92551  544462           RIBBON REEL HEARTS DESIGN        1 20/02/11 14:21  1.65
## 92589  544462                IVORY KITCHEN SCALES        1 20/02/11 14:21  8.50
## 92614  544463      WHITE VINTAGE CRYSTAL BRACELET        2 20/02/11 14:31  6.75
## 92640  544463             20 DOLLY PEGS RETROSPOT        1 20/02/11 14:31  1.25
## 92645  544463            FELT FARM ANIMAL CHICKEN        1 20/02/11 14:31  1.25
## 92648  544463             STRAWBERRY   PICNIC BAG        1 20/02/11 14:31  2.95
## 92653  544463            FELT FARM ANIMAL CHICKEN        1 20/02/11 14:31  1.25
## 92658  544463  WHITE/PINK CHICK EASTER DECORATION        1 20/02/11 14:31  0.85
## 92659  544463            FELT FARM ANIMAL CHICKEN        1 20/02/11 14:31  1.25
## 92675  544463          ENAMEL MEASURING JUG CREAM        1 20/02/11 14:31  4.25
## 92688  544463     CANDLEHOLDER PINK HANGING HEART        1 20/02/11 14:31  2.95
## 92733  544465               CHOCOLATE BOX RIBBONS        1 20/02/11 15:06  1.25
## 92752  544465                IVORY KITCHEN SCALES        1 20/02/11 15:06  8.50
## 92812  544467      SMALL CHUNKY GLASS ROMAN  BOWL        1 20/02/11 15:51  2.95
## 92823  544467         FRENCH LAVENDER SCENT HEART        1 20/02/11 15:51  2.10
## 93344  544569                    EMPIRE GIFT WRAP       25 21/02/11 12:58  0.42
## 93354  544569     SET/20 STRAWBERRY PAPER NAPKINS        6 21/02/11 12:58  0.85
## 93369  544569     PINK HEART SHAPE EGG FRYING PAN        2 21/02/11 12:58  1.65
## 93373  544569     GREEN REGENCY TEACUP AND SAUCER        1 21/02/11 12:58  2.95
## 93379  544569                RECIPE BOX RETROSPOT        3 21/02/11 12:58  2.95
## 93381  544569  DECORATION , WOBBLY RABBIT , METAL       12 21/02/11 12:58  1.65
## 93548  544586      DOORMAT SPOTTY HOME SWEET HOME        1 21/02/11 15:04  7.95
## 93656  544586     HOT WATER BOTTLE I AM SO POORLY        1 21/02/11 15:04  4.65
## 93661  544586          TV DINNER TRAY AIR HOSTESS        1 21/02/11 15:04  4.95
## 93751  544597      PACK OF 60 DINOSAUR CAKE CASES        1 21/02/11 17:42  0.55
## 93754  544597       GINGERBREAD MAN COOKIE CUTTER        1 21/02/11 17:42  1.25
## 93775  544597         FELTCRAFT CUSHION BUTTERFLY        1 21/02/11 17:42  3.75
## 93776  544597            FELTCRAFT CUSHION RABBIT        1 21/02/11 17:42  3.75
## 94235  544610          COTTON APRON PANTRY DESIGN        4 22/02/11 10:09  4.95
## 94275  544634             WATERING CAN PINK BUNNY        1 22/02/11 11:02  1.95
## 94854  544666  METAL 4 HOOK HANGER FRENCH CHATEAU        1 22/02/11 15:00  2.95
## 94860  544666   WOOD S/3 CABINET ANT WHITE FINISH        2 22/02/11 15:00  8.95
## 95218  544678                     VINTAGE RED MUG        1 22/02/11 16:15  1.25
## 95899  544700   VINTAGE HEADS AND TAILS CARD GAME       24 23/02/11 10:10  1.25
## 96484  544778   GROW YOUR OWN BASIL IN ENAMEL MUG        1 23/02/11 12:03  2.10
## 98451  544930           HEART IVORY TRELLIS SMALL        1 24/02/11 18:26  1.25
## 98459  544930       MONEY BOX POCKET MONEY DESIGN        1 24/02/11 18:26  1.25
## 98463  544930         POTTING SHED SEED ENVELOPES        1 24/02/11 18:26  1.25
## 98468  544930         POTTING SHED SEED ENVELOPES        1 24/02/11 18:26  1.25
## 98491  544930   SET OF 6 SPICE TINS PANTRY DESIGN        1 24/02/11 18:26  3.95
## 99496  545036                 BATHROOM METAL SIGN        1 25/02/11 17:25  0.55
## 99545  545038           AREA PATROLLED METAL SIGN        1 27/02/11 10:13  2.10
## 99577  545039              TEA TIME KITCHEN APRON        1 27/02/11 10:22  5.95
## 99579  545039              TEA TIME KITCHEN APRON        1 27/02/11 10:22  5.95
## 99581  545039          WOODEN FRAME ANTIQUE WHITE        6 27/02/11 10:22  2.95
## 99631  545043              TEA TIME PARTY BUNTING        1 27/02/11 11:05  4.95
## 99654  545045  WOOD 2 DRAWER CABINET WHITE FINISH        2 27/02/11 11:40  6.95
## 99657  545045   WOOD S/3 CABINET ANT WHITE FINISH        2 27/02/11 11:40  8.95
## 99677  545045                IVORY KITCHEN SCALES        1 27/02/11 11:40  8.50
## 99682  545045               WHITE WIRE EGG HOLDER        1 27/02/11 11:40  7.50
## 99703  545045    HANGING CHICK  YELLOW DECORATION        1 27/02/11 11:40  1.45
## 99714  545045 SET 3 PAPER VINTAGE CHICK PAPER EGG        1 27/02/11 11:40  2.95
## 99844  545053          3 HOOK HANGER MAGIC GARDEN        1 27/02/11 12:41  1.95
## 99847  545053       36 PENCILS TUBE RED RETROSPOT        1 27/02/11 12:41  1.25
## 99869  545054             HANGING HEART WITH BELL        1 27/02/11 12:41  1.25
## 99891  545054                HEN HOUSE DECORATION        2 27/02/11 12:41  1.65
## 99998  545059                    CARD PARTY GAMES       12 27/02/11 13:04  0.42
## 100012 545059      VINTAGE PAISLEY STATIONERY SET        1 27/02/11 13:04  2.95
## 100067 545060  WOOD 2 DRAWER CABINET WHITE FINISH        2 27/02/11 13:47  6.95
## 100121 545062          ENAMEL MEASURING JUG CREAM        1 27/02/11 14:07  4.25
## 100137 545062              JAM JAR WITH GREEN LID        1 27/02/11 14:07  0.85
## 100139 545062              GLASS JAR KINGS CHOICE        1 27/02/11 14:07  2.95
## 100218 545066 DECORATION  BUTTERFLY  MAGIC GARDEN        2 27/02/11 14:44  0.85
## 100240 545066        SET OF 4 PANTRY JELLY MOULDS        1 27/02/11 14:44  1.25
## 100242 545066   GROW YOUR OWN BASIL IN ENAMEL MUG        1 27/02/11 14:44  2.10
## 100311 545071    FRUIT TREE AND BIRDS WALL PLAQUE        1 27/02/11 15:59  7.95
## 100316 545071 GARDENIA 1 WICK MORRIS BOXED CANDLE        1 27/02/11 15:59  4.25
## 100559 545079              JUMBO STORAGE BAG SUKI        1 28/02/11 10:30  1.95
## 100696 545085                  RED RETROSPOT BOWL        8 28/02/11 11:19  1.25
## 100698 545085       CHOC TRUFFLE GOLD TRINKET POT        2 28/02/11 11:19  1.65
## 100701 545085                  RED KITCHEN SCALES        1 28/02/11 11:19  8.50
## 100702 545085           PINK DOUGHNUT TRINKET POT        2 28/02/11 11:19  1.65
## 100713 545085        SET OF 4 PANTRY JELLY MOULDS        1 28/02/11 11:19  1.25
## 100720 545085         HANGING METAL HEART LANTERN        6 28/02/11 11:19  1.65
## 100895 545153             FLYING PIG WATERING CAN        1 28/02/11 12:57  2.95
## 101060 545165  DOORMAT FANCY FONT HOME SWEET HOME        1 28/02/11 13:41  7.95
## 101062 545165      DOORMAT SPOTTY HOME SWEET HOME        1 28/02/11 13:41  7.95
## 101074 545166    ZINC WILLIE WINKIE  CANDLE STICK        1 28/02/11 14:03  0.85
## 101094 545166          FRENCH ENAMEL CANDLEHOLDER        1 28/02/11 14:03  2.10
## 101102 545166                 FLORAL BATHROOM SET        1 28/02/11 14:03  3.75
## 101300 545188                   POLKADOT RAIN HAT        1 28/02/11 15:19  0.42
## 101330 545188         MAGIC DRAWING SLATE BUNNIES        1 28/02/11 15:19  0.42
## 101350 545188    SET OF 3 CAKE TINS PANTRY DESIGN        1 28/02/11 15:19  4.95
## 101362 545188    SET OF 3 CAKE TINS PANTRY DESIGN        1 28/02/11 15:19  4.95
## 101364 545188          ALARM CLOCK BAKELIKE GREEN        1 28/02/11 15:19  3.75
## 101392 545188         CHILDREN'S APRON DOLLY GIRL        1 28/02/11 15:19  2.10
## 102367 545290                 UNION FLAG WINDSOCK        1 01/03/11 12:01  1.25
## 102629 545312            ASSORTED CIRCULAR MOBILE        3 01/03/11 13:51  0.21
## 103106 545334        CREAM FELT EASTER EGG BASKET        1 01/03/11 16:34  1.65
## 103121 545337                 PAINTED PINK RABBIT        1 01/03/11 17:28  0.85
## 103125 545337       PENCIL CASE LIFE IS BEAUTIFUL        2 01/03/11 17:28  2.95
## 103962 545459             MA CAMPAGNE CUTLERY BOX        1 02/03/11 17:21 14.95
## 103989 545460               EASTER CRAFT 4 CHICKS        1 02/03/11 17:33  1.95
## 104000 545460          RETRO COFFEE MUGS ASSORTED        1 02/03/11 17:33  1.25
## 104002 545460     CIRCUS PARADE CHILDRENS EGG CUP        1 02/03/11 17:33  1.25
## 104014 545460     CERAMIC PIRATE CHEST MONEY BANK        1 02/03/11 17:33  1.45
## 104615 545518     EASTER BUNNY GARLAND OF FLOWERS       48 03/03/11 12:24  0.42
## 104656 545523        DOG BOWL CHASING BALL DESIGN        2 03/03/11 12:41  3.75
## 104666 545523          ROUND CAKE TIN VINTAGE RED        1 03/03/11 12:41  7.95
## 105054 545559        SET OF 4 PANTRY JELLY MOULDS        1 03/03/11 15:31  1.25
## 105562 545587        SMALL MARSHMALLOWS PINK BOWL        1  04/03/11 9:46  1.25
## 105970 545655             LUNCH BAG PINK POLKADOT        1 04/03/11 13:58  1.65
## 105994 545655      IVORY HANGING DECORATION  BIRD        2 04/03/11 13:58  0.85
## 106025 545658                SLEEPING CAT ERASERS        1 04/03/11 14:13  0.21
## 106039 545658        FELT FARM ANIMAL WHITE BUNNY        1 04/03/11 14:13  0.85
## 106055 545658                SLEEPING CAT ERASERS        1 04/03/11 14:13  0.21
## 106060 545658                   6 ROCKET BALLOONS        2 04/03/11 14:13  0.65
## 106073 545658              TEA TIME PARTY BUNTING        1 04/03/11 14:13  4.95
## 106074 545658        FELT FARM ANIMAL WHITE BUNNY        1 04/03/11 14:13  0.85
## 106078 545658            VINTAGE UNION JACK APRON        1 04/03/11 14:13  6.95
## 106441 545669     HOT WATER BOTTLE I AM SO POORLY        2 06/03/11 10:05  4.65
## 106604 545683        RETROSPOT SMALL TUBE MATCHES        1 06/03/11 11:50  1.65
## 106605 545683           RIBBON REEL HEARTS DESIGN        1 06/03/11 11:50  1.65
## 106655 545685   ENGLISH ROSE SMALL SCENTED FLOWER        2 06/03/11 11:55  0.85
## 106660 545685             PANTRY WASHING UP BRUSH        1 06/03/11 11:55  1.45
## 106704 545687  SET OF 12 MINI BUNNIES IN A BUCKET        1 06/03/11 12:20  2.10
## 106808 545688           DAIRY MAID LARGE MILK JUG        1 06/03/11 12:42  4.95
## 107030 545695        SET OF 4 PANTRY JELLY MOULDS       12 06/03/11 14:15  1.25
## 107083 545696    RED RETROSPOT TRADITIONAL TEAPOT        1 06/03/11 14:21  7.95
## 107768 545721     GREEN REGENCY TEACUP AND SAUCER        1 07/03/11 10:52  2.95
## 107769 545721 CLEAR DRAWER KNOB ACRYLIC EDWARDIAN       12 07/03/11 10:52  1.25
## 108050 545830      YOU'RE CONFUSING ME METAL SIGN        2 07/03/11 13:10  1.69
## 108131 545838             LUNCH BAG  BLACK SKULL.        1 07/03/11 13:33  1.65
## 108132 545838                 LUNCH BAG CARS BLUE        1 07/03/11 13:33  1.65
## 108133 545838              TOY TIDY PINK POLKADOT        1 07/03/11 13:33  2.10
## 108422 545872         ZINC METAL HEART DECORATION        2 07/03/11 14:51  1.25
## 108717 545895      METAL SIGN,CUPCAKE SINGLE HOOK        1 07/03/11 17:14  2.46
## 109012 545901                      DAISY NOTEBOOK        1 07/03/11 17:52  1.65
## 109051 545901     CHERRY BLOSSOM DECORATIVE FLASK        1 07/03/11 17:52  3.75
## 109107 545901           CARAVAN SQUARE TISSUE BOX        1 07/03/11 17:52  1.25
## 109127 545901     BLUE EASTER EGG HUNT START POST        1 07/03/11 17:52  1.95
## 109659 545978 DECORATION WHITE CHICK MAGIC GARDEN        6 08/03/11 12:19  0.85
## 109690 545978              STRAWBERRY SHOPPER BAG        2 08/03/11 12:19  1.25
## 109766 545980       LAVENDER SCENTED FABRIC HEART       10 08/03/11 12:49  1.25
## 109769 545980                    PARTY METAL SIGN        1 08/03/11 12:49  1.45
## 109772 545980      IVORY GIANT GARDEN THERMOMETER        1 08/03/11 12:49  5.95
## 109773 545980         APRON MODERN VINTAGE COTTON        2 08/03/11 12:49  1.95
## 109774 545980         ZINC METAL HEART DECORATION        2 08/03/11 12:49  1.25
## 109890 545995    FUNKY WASHING UP GLOVES ASSORTED        2 08/03/11 13:54  2.10
## 109891 545995    FUNKY WASHING UP GLOVES ASSORTED        2 08/03/11 13:54  2.10
## 110155 546003             CHILDS GARDEN RAKE PINK        2 08/03/11 15:07  2.10
## 111031 546089          DINOSAUR KEYRINGS ASSORTED       36 09/03/11 11:44  0.21
## 111194 546105           ASSORTED EASTER GIFT TAGS        2 09/03/11 12:21  0.85
## 111206 546105         PACK OF 12 WOODLAND TISSUES       12 09/03/11 12:21  0.29
## 111210 546105       RED TOADSTOOL LED NIGHT LIGHT        2 09/03/11 12:21  1.65
## 111251 546107  JUNGLE POPSICLES ICE LOLLY HOLDERS        1 09/03/11 12:33  1.25
## 111266 546107  ROUND SNACK BOXES SET OF4 WOODLAND        1 09/03/11 12:33  2.95
## 111268 546107                  LUNCH BAG WOODLAND        1 09/03/11 12:33  1.65
## 111324 546108                  LUNCH BAG WOODLAND        1 09/03/11 12:35  1.65
## 111358 546111             RIBBON REEL LACE DESIGN        1 09/03/11 12:39  2.10
## 112537 546261           JUMBO BAG SPACEBOY DESIGN        1 10/03/11 15:01  1.95
## 113495 546392      SET OF 4 ENGLISH ROSE COASTERS        1 11/03/11 14:15  1.25
## 113739 546406      METAL SIGN,CUPCAKE SINGLE HOOK        1 11/03/11 16:21  2.46
## 113903 546419      CREAM CUPID HEARTS COAT HANGER        1 13/03/11 11:06  4.15
## 113986 546422    RED RETROSPOT TEA CUP AND SAUCER        2 13/03/11 11:38  3.75
## 114091 546424 DECORATION WHITE CHICK MAGIC GARDEN        1 13/03/11 12:51  0.85
## 114097 546424      BUNNY WOODEN PAINTED WITH BIRD        1 13/03/11 12:51  0.85
## 114148 546426             LUNCH BAG  BLACK SKULL.        4 13/03/11 13:46  1.65
## 114155 546426                LANTERN CREAM GAZEBO        1 13/03/11 13:46  4.95
## 114255 546429      PACK OF 60 SPACEBOY CAKE CASES        1 13/03/11 15:25  0.55
## 114256 546429      72 SWEETHEART FAIRY CAKE CASES        1 13/03/11 15:25  0.55
## 114257 546429     60 CAKE CASES DOLLY GIRL DESIGN        1 13/03/11 15:25  0.55
## 114258 546429     PACK OF 72 RETROSPOT CAKE CASES        1 13/03/11 15:25  0.55
## 114280 546429  JUNGLE POPSICLES ICE LOLLY HOLDERS        1 13/03/11 15:25  1.25
## 114301 546429           BLUE CIRCLES DESIGN TEDDY        1 13/03/11 15:25  2.55
## 114593 546466             CHILDS GARDEN FORK BLUE        1 14/03/11 11:04  0.85
## 114630 546466             LUNCH BAG  BLACK SKULL.        1 14/03/11 11:04  1.65
## 114691 546498               DOORMAT 3 SMILEY CATS        1 14/03/11 11:44  7.95
## 114694 546498      DOORMAT SPOTTY HOME SWEET HOME        1 14/03/11 11:44  7.95
## 114695 546498                  DOORMAT UNION FLAG        1 14/03/11 11:44  7.95
## 114789 546502             PANTRY WASHING UP BRUSH        1 14/03/11 11:46  1.45
## 114810 546502         RETROSPOT CIGAR BOX MATCHES        1 14/03/11 11:46  1.25
## 114811 546502             PANTRY WASHING UP BRUSH        1 14/03/11 11:46  1.45
## 114812 546502        SET OF 4 PANTRY JELLY MOULDS        1 14/03/11 11:46  1.25
## 114817 546502                       CHILLI LIGHTS        1 14/03/11 11:46  5.75
## 114820 546502          ENAMEL MEASURING JUG CREAM        1 14/03/11 11:46  4.25
## 114821 546502              PANTRY SCRUBBING BRUSH        1 14/03/11 11:46  1.65
## 114826 546502         BOX OF 24 COCKTAIL PARASOLS        1 14/03/11 11:46  0.42
## 114833 546502        SET OF 4 PANTRY JELLY MOULDS        1 14/03/11 11:46  1.25
## 114834 546502                  GLASS  BEURRE DISH        1 14/03/11 11:46  3.95
## 114930 546528    3 HOOK PHOTO SHELF ANTIQUE WHITE       12 14/03/11 13:04  7.65
## 115166 546542    FUNKY WASHING UP GLOVES ASSORTED        1 14/03/11 15:13  2.10
## 115421 546561      NATURAL SLATE CHALKBOARD LARGE        3 15/03/11 10:34  4.95
## 115484 546622           CHARLOTTE BAG SUKI DESIGN        1 15/03/11 11:30  0.85
## 115583 546635             LUNCH BAG RED RETROSPOT        1 15/03/11 12:11  1.65
## 115585 546635         LUNCH BAG DOLLY GIRL DESIGN        1 15/03/11 12:11  1.65
## 116292 546669              JAM MAKING SET PRINTED       12 15/03/11 15:36  1.45
## 116405 546670     CHERRY BLOSSOM DECORATIVE FLASK        1 15/03/11 15:37  3.75
## 116717 546731                  PINK PAPER PARASOL        6 16/03/11 11:39  2.95
## 116718 546731              RED RETROSPOT UMBRELLA        3 16/03/11 11:39  5.95
## 116719 546731  PACK OF 60 PINK PAISLEY CAKE CASES       24 16/03/11 11:39  0.55
## 116835 546742      HANGING CHICK CREAM DECORATION       24 16/03/11 12:26  1.45
## 116861 546742      MINI PAINTED GARDEN DECORATION        1 16/03/11 12:26  0.85
## 117208 546774          RECYCLED ACAPULCO MAT PINK        1 16/03/11 15:45  8.25
## 117227 546774       FLOWER VINE RAFFIA FOOD COVER        2 16/03/11 15:45  3.75
## 117264 546774           HEART FILIGREE DOVE LARGE        2 16/03/11 15:45  1.65
## 117298 546774           PINK  HONEYCOMB PAPER FAN        1 16/03/11 15:45  2.10
## 117623 546846             TEATIME PEN CASE & PENS        2 17/03/11 12:47  0.85
## 117678 546849            REGENCY CAKESTAND 3 TIER        1 17/03/11 13:13 12.75
## 117743 546850              SPACEBOY BIRTHDAY CARD       12 17/03/11 13:20  0.42
## 117958 546866            HOME BUILDING BLOCK WORD        1 17/03/11 15:47  5.95
## 117968 546866          HEART FILIGREE DOVE  SMALL        1 17/03/11 15:47  1.25
## 117973 546866           HEART FILIGREE DOVE LARGE        1 17/03/11 15:47  1.65
## 119143 546908            HOME BUILDING BLOCK WORD        3 17/03/11 18:59  5.95
## 119226 546912      TOILET SIGN OCCUPIED OR VACANT        3 17/03/11 20:12  0.83
## 119266 546912              MONSTERS STENCIL CRAFT        3 17/03/11 20:12  1.25
## 119559 546950            FELT FARM ANIMAL CHICKEN        1 18/03/11 11:24  1.25
## 119584 546950               FELT EGG COSY CHICKEN        3 18/03/11 11:24  0.85
## 119600 546950     RETROSPOT TEA SET CERAMIC 11 PC        1 18/03/11 11:24  4.95
## 119603 546950           LUNCH BAG SPACEBOY DESIGN        1 18/03/11 11:24  1.65
## 119625 546951      METAL SIGN NEIGHBOURHOOD WITCH        1 18/03/11 11:30  2.10
## 119628 546951           I'M ON HOLIDAY METAL SIGN        1 18/03/11 11:30  2.10
## 119639 546951               EASTER CRAFT 4 CHICKS        1 18/03/11 11:30  1.95
## 119651 546951                    HEARTS GIFT TAPE        2 18/03/11 11:30  0.65
## 119657 546951     BLUE STRIPE CERAMIC DRAWER KNOB        6 18/03/11 11:30  1.25
## 119658 546951        RED SPOT CERAMIC DRAWER KNOB        6 18/03/11 11:30  1.25
## 119659 546951       BLUE SPOT CERAMIC DRAWER KNOB        6 18/03/11 11:30  1.25
## 119669 546951          FELTCRAFT 6 FLOWER FRIENDS        1 18/03/11 11:30  2.10
## 119670 546951          FELTCRAFT 6 FLOWER FRIENDS        1 18/03/11 11:30  2.10
## 120017 546982             LUNCH BOX I LOVE LONDON        1 18/03/11 12:26  1.95
## 120030 546982             LUNCH BOX I LOVE LONDON        1 18/03/11 12:26  1.95
## 120124 546984             CUBIC MUG PINK POLKADOT        6 18/03/11 12:35  0.39
## 120152 546984              RED GINGHAM TEDDY BEAR        1 18/03/11 12:35  2.95
## 120156 546984            PAPER BUNTING WHITE LACE        1 18/03/11 12:35  2.95
## 120158 546984        BAKING SET 9 PIECE RETROSPOT        1 18/03/11 12:35  4.95
## 120326 546993       36 PENCILS TUBE RED RETROSPOT        2 18/03/11 13:19  1.25
## 120591 547021      METAL SIGN,CUPCAKE SINGLE HOOK        8 18/03/11 15:43  1.25
## 120639 547028        PLEASE ONE PERSON METAL SIGN       12 20/03/11 10:13  2.10
## 121004 547046       SET OF 4 FAIRY CAKE PLACEMATS        4 20/03/11 11:43  3.75
## 121023 547049                 PHOTO FRAME CORNICE        4 20/03/11 11:56  2.95
## 121047 547050          DINOSAUR KEYRINGS ASSORTED       36 20/03/11 12:02  0.21
## 121299 547063        FIVE CATS HANGING DECORATION        1 20/03/11 13:33  2.95
## 121301 547063         GIFT BAG PSYCHEDELIC APPLES       12 20/03/11 13:33  0.65
## 121307 547063              SWALLOWS GREETING CARD       12 20/03/11 13:33  0.42
## 121363 547063   WOOD BLACK BOARD ANT WHITE FINISH        6 20/03/11 13:33  7.90
## 121369 547063       FRIDGE MAGNETS LA VIE EN ROSE       12 20/03/11 13:33  0.85
## 121376 547063       MAGNETS PACK OF 4 RETRO PHOTO        1 20/03/11 13:33  1.25
## 121386 547063 COLOUR GLASS T-LIGHT HOLDER HANGING        8 20/03/11 13:33  0.65
## 121389 547063  PINK DRAWER KNOB ACRYLIC EDWARDIAN       24 20/03/11 13:33  1.25
## 121405 547063   MAGNETS PACK OF 4 VINTAGE COLLAGE        1 20/03/11 13:33  1.25
## 121407 547063              MORE BUTTER METAL SIGN        1 20/03/11 13:33  2.10
## 121413 547063       FRENCH GARDEN SIGN BLUE METAL        2 20/03/11 13:33  1.25
## 121439 547063  BLUE DRAWER KNOB ACRYLIC EDWARDIAN       12 20/03/11 13:33  1.25
## 121464 547063       WELCOME  WOODEN BLOCK LETTERS        1 20/03/11 13:33  9.95
## 121702 547069     SET 12 KIDS  WHITE CHALK STICKS        3 20/03/11 13:52  0.42
## 121706 547069            PLASTERS IN TIN SPACEBOY        1 20/03/11 13:52  1.65
## 121722 547069    PACK OF 20 NAPKINS PANTRY DESIGN        1 20/03/11 13:52  0.85
## 121752 547070          FELT EGG COSY WHITE RABBIT        1 20/03/11 13:58  0.85
## 121764 547070                BRIGHT BLUES RIBBONS        1 20/03/11 13:58  1.25
## 121771 547070           SCANDINAVIAN REDS RIBBONS        1 20/03/11 13:58  1.25
## 121772 547070              ROMANTIC PINKS RIBBONS        1 20/03/11 13:58  1.25
## 121973 547083          PEACE WOODEN BLOCK LETTERS        1 20/03/11 15:21  6.95
## 121985 547083            GLASS CHALICE BLUE SMALL        2 20/03/11 15:21  1.65
## 122463 547134                DOORMAT ENGLISH ROSE        2 21/03/11 11:57  7.95
## 122495 547194    PLASTERS IN TIN WOODLAND ANIMALS        1 21/03/11 12:42  1.65
## 122518 547194 SET OF 2 TEA TOWELS APPLE AND PEARS        1 21/03/11 12:42  2.95
## 122866 547223    I CAN ONLY PLEASE ONE PERSON MUG        6 21/03/11 15:10  1.25
## 122906 547223             LUNCH BAG  BLACK SKULL.        1 21/03/11 15:10  1.65
## 122944 547224       CHRISTMAS METAL TAGS ASSORTED        6 21/03/11 15:15  0.85
## 123067 547243                 KEY FOB , BACK DOOR        2 21/03/11 16:59  0.65
## 123781 547273       PHOTO FRAME 3 CLASSIC HANGING        2 22/03/11 11:05  9.95
## 123799 547273    FAMILY ALBUM WHITE PICTURE FRAME        1 22/03/11 11:05  8.50
## 124047 547358     WHITE JEWELLED HEART DECORATION        8 22/03/11 12:25  0.85
## 124394 547372       SMALL GLASS HEART TRINKET POT        1 22/03/11 13:46  2.10
## 124424 547374    TRADITIONAL WOODEN SKIPPING ROPE        1 22/03/11 13:54  1.25
## 124431 547374   TRADITIONAL WOODEN CATCH CUP GAME        1 22/03/11 13:54  1.25
## 124447 547374     EASTER DECORATION SITTING BUNNY        1 22/03/11 13:54  0.85
## 124457 547374     FELTCRAFT HAIRBAND RED AND BLUE        1 22/03/11 13:54  0.85
## 124461 547374             EGG CUP NATURAL CHICKEN        1 22/03/11 13:54  1.25
## 124476 547374     EASTER DECORATION HANGING BUNNY        1 22/03/11 13:54  0.65
## 124480 547374   SET OF 6 SPICE TINS PANTRY DESIGN        1 22/03/11 13:54  3.95
## 125969 547498       PINK BREAKFAST CUP AND SAUCER        1 23/03/11 12:24  0.39
## 125970 547498       PINK BREAKFAST CUP AND SAUCER        1 23/03/11 12:24  0.39
## 125971 547498     YELLOW BREAKFAST CUP AND SAUCER        1 23/03/11 12:24  0.39
## 125972 547498     YELLOW BREAKFAST CUP AND SAUCER        1 23/03/11 12:24  0.39
## 125990 547498       BUNNY DECORATION MAGIC GARDEN        1 23/03/11 12:24  0.85
## 126006 547498             LUNCH BAG PINK POLKADOT        1 23/03/11 12:24  1.65
## 126012 547498                BAG OF SILVER STONES        1 23/03/11 12:24  0.42
## 126035 547498            CHILDRENS DOLLY GIRL MUG        1 23/03/11 12:24  1.65
## 126036 547498             CHILDREN'S SPACEBOY MUG        1 23/03/11 12:24  1.65
## 126037 547498             CHILDREN'S SPACEBOY MUG        1 23/03/11 12:24  1.65
## 126038 547498  SMALL DOLLY MIX DESIGN ORANGE BOWL        1 23/03/11 12:24  0.42
## 126039 547498        SMALL LICORICE DES PINK BOWL        1 23/03/11 12:24  0.42
## 126040 547498        SMALL MARSHMALLOWS PINK BOWL        1 23/03/11 12:24  0.42
## 126041 547498          SMALL CHOCOLATES PINK BOWL        1 23/03/11 12:24  0.42
## 126042 547498      BISCUITS SMALL BOWL LIGHT BLUE        1 23/03/11 12:24  0.42
## 126048 547498           SET OF 6 HEART CHOPSTICKS        1 23/03/11 12:24  1.25
## 127263 547650      SET 2 PANTRY DESIGN TEA TOWELS        4 24/03/11 12:08  3.25
## 127280 547651      METAL SIGN,CUPCAKE SINGLE HOOK        1 24/03/11 12:11  1.25
## 127281 547651      METAL SIGN,CUPCAKE SINGLE HOOK        1 24/03/11 12:11  1.25
## 127283 547651      METAL SIGN,CUPCAKE SINGLE HOOK        1 24/03/11 12:11  1.25
## 127284 547651      METAL SIGN,CUPCAKE SINGLE HOOK        1 24/03/11 12:11  1.25
## 127285 547651      METAL SIGN CUPCAKE SINGLE HOOK        1 24/03/11 12:11  1.25
## 127286 547651      METAL SIGN,CUPCAKE SINGLE HOOK        1 24/03/11 12:11  1.25
## 127293 547651              PAPER CHAIN KIT EMPIRE        1 24/03/11 12:11  2.95
## 127297 547651      IVORY HANGING DECORATION  BIRD        1 24/03/11 12:11  0.85
## 127310 547651     6 CHOCOLATE LOVE HEART T-LIGHTS        1 24/03/11 12:11  2.10
## 127321 547651    PLASTERS IN TIN WOODLAND ANIMALS        1 24/03/11 12:11  1.65
## 127323 547651            PLASTERS IN TIN SPACEBOY        1 24/03/11 12:11  1.65
## 127326 547651              PLASTERS IN TIN SKULLS        1 24/03/11 12:11  1.65
## 127327 547651       PLASTERS IN TIN CIRCUS PARADE        1 24/03/11 12:11  1.65
## 127328 547651           PLASTERS IN TIN STRONGMAN        1 24/03/11 12:11  1.65
## 127340 547651              RED RETROSPOT UMBRELLA        1 24/03/11 12:11  5.95
## 127341 547651              EDWARDIAN PARASOL PINK        1 24/03/11 12:11  5.95
## 127345 547651      HANGING CHICK CREAM DECORATION        1 24/03/11 12:11  1.45
## 127346 547651    HANGING CHICK  YELLOW DECORATION        1 24/03/11 12:11  1.45
## 127350 547651      HANGING CHICK GREEN DECORATION        1 24/03/11 12:11  1.45
## 127352 547651 DECORATION WHITE CHICK MAGIC GARDEN        1 24/03/11 12:11  0.85
## 127353 547651    HANGING CHICK  YELLOW DECORATION        1 24/03/11 12:11  1.45
## 127354 547651 DECORATION WHITE CHICK MAGIC GARDEN        1 24/03/11 12:11  0.85
## 127356 547651  DECORATION , WOBBLY CHICKEN, METAL        1 24/03/11 12:11  1.65
## 127357 547651      HANGING CHICK CREAM DECORATION        1 24/03/11 12:11  1.45
## 127358 547651 DECORATION  PINK CHICK MAGIC GARDEN        1 24/03/11 12:11  0.85
## 127362 547651 DECORATION WHITE CHICK MAGIC GARDEN        1 24/03/11 12:11  0.85
## 127363 547651     HANGING METAL RABBIT DECORATION        1 24/03/11 12:11  1.25
## 127364 547651            GINGHAM HEART DECORATION        1 24/03/11 12:11  0.85
## 127365 547651     HANGING WOOD AND FELT BUTTERFLY        1 24/03/11 12:11  0.42
## 127366 547651 SET/3 RABBITS FLOWER SKIPPPING ROPE        1 24/03/11 12:11  0.85
## 127367 547651      HANGING CHICK GREEN DECORATION        1 24/03/11 12:11  1.45
## 127369 547651      HANGING HEN ON NEST DECORATION        1 24/03/11 12:11  1.65
## 127385 547651          WATERING CAN BLUE ELEPHANT        1 24/03/11 12:11  1.95
## 127426 547653           ASSORTED EASTER GIFT TAGS        6 24/03/11 12:21  0.85
## 127705 547663           FELTCRAFT GIRL AMELIE KIT        1 24/03/11 13:16  4.95
## 127710 547663              PARTY INVITES WOODLAND        1 24/03/11 13:16  0.85
## 127725 547663         PINK HAPPY BIRTHDAY BUNTING        1 24/03/11 13:16  5.45
## 127751 547663            BLACK AND WHITE DOG BOWL        2 24/03/11 13:16  2.95
## 127755 547663              IVORY DINER WALL CLOCK        1 24/03/11 13:16  8.50
## 127802 547664            BLUE POLKADOT COFFEE MUG       12 24/03/11 13:16  0.39
## 127926 547670        GLASS JAR DIGESTIVE BISCUITS        1 24/03/11 13:41  2.95
## 127941 547670            6 EGG HOUSE PAINTED WOOD        2 24/03/11 13:41  7.95
## 128103 547689             ENAMEL FLOWER JUG CREAM        2 24/03/11 14:55  5.95
## 128233 547705              IVORY DINER WALL CLOCK        1 24/03/11 18:20  8.50
## 128234 547705              IVORY DINER WALL CLOCK        1 24/03/11 18:20  8.50
## 128236 547705   SET OF 6 SPICE TINS PANTRY DESIGN        1 24/03/11 18:20  3.95
## 128237 547705   SET OF 6 SPICE TINS PANTRY DESIGN        1 24/03/11 18:20  3.95
## 128283 547709 CLASSIC METAL BIRDCAGE PLANT HOLDER        1 24/03/11 18:43 12.75
## 128289 547712     ROSES REGENCY TEACUP AND SAUCER        1 24/03/11 19:31  2.95
## 128290 547712     ROSES REGENCY TEACUP AND SAUCER        1 24/03/11 19:31  2.95
## 128291 547712     ROSES REGENCY TEACUP AND SAUCER        1 24/03/11 19:31  2.95
## 128295 547712     GREEN REGENCY TEACUP AND SAUCER        1 24/03/11 19:31  2.95
## 128296 547712     ROSES REGENCY TEACUP AND SAUCER        1 24/03/11 19:31  2.95
## 128312 547712                BLACK KITCHEN SCALES        1 24/03/11 19:31  8.50
## 128315 547712              IVORY DINER WALL CLOCK        1 24/03/11 19:31  8.50
## 128597 547772       CREAM SLICE FLANNEL PINK SPOT        1 25/03/11 11:34  2.95
## 128620 547772  DECORATION , WOBBLY RABBIT , METAL        2 25/03/11 11:34  1.65
## 128634 547772         GREY HEART HOT WATER BOTTLE        1 25/03/11 11:34  3.75
## 128712 547786            HOME BUILDING BLOCK WORD        1 25/03/11 11:44  5.95
## 128751 547786           CHILDS GARDEN TROWEL PINK        1 25/03/11 11:44  0.85
## 129036 547795   SET 20 NAPKINS FAIRY CAKES DESIGN        1 25/03/11 12:21  0.85
## 129190 547809        COFFEE MUG CAT + BIRD DESIGN        2 25/03/11 13:54  2.55
## 129191 547809        COFFEE MUG DOG + BALL DESIGN        2 25/03/11 13:54  2.55
## 129203 547809            BLUE PAISLEY POCKET BOOK        1 25/03/11 13:54  0.85
## 129204 547809        MODERN FLORAL STATIONERY SET        1 25/03/11 13:54  2.95
## 129807 547860 DECORATION WHITE CHICK MAGIC GARDEN        3 27/03/11 12:21  0.85
## 129880 547860     WHITE JEWELLED HEART DECORATION        6 27/03/11 12:21  0.85
## 130010 547867         60 TEATIME FAIRY CAKE CASES        1 27/03/11 13:56  0.55
## 130071 547870      METAL SIGN,CUPCAKE SINGLE HOOK        4 27/03/11 14:18  1.25
## 130072 547870      METAL SIGN,CUPCAKE SINGLE HOOK        4 27/03/11 14:18  1.25
## 130157 547872            SET OF 4 JAM JAR MAGNETS        1 27/03/11 14:34  2.08
## 130163 547872         LUNCH BAG DOLLY GIRL DESIGN        1 27/03/11 14:34  1.65
## 130204 547874          WATERING CAN GARDEN MARKER       10 27/03/11 15:39  1.25
## 130213 547874      MINI PAINTED GARDEN DECORATION       12 27/03/11 15:39  0.85
## 130779 547906          FELT EGG COSY WHITE RABBIT        1 28/03/11 12:13  0.85
## 130784 547906          FELT EGG COSY WHITE RABBIT        1 28/03/11 12:13  0.85
## 130821 547906          FELT EGG COSY WHITE RABBIT        1 28/03/11 12:13  0.85
## 130835 547906      BUFFALO BILL TREASURE BOOK BOX        1 28/03/11 12:13  2.25
## 130952 547910             CUBIC MUG PINK POLKADOT        6 28/03/11 12:23  0.39
## 130992 547910        SET OF 4 PANTRY JELLY MOULDS        1 28/03/11 12:23  1.25
## 131371 547940 CLEAR DRAWER KNOB ACRYLIC EDWARDIAN       24 28/03/11 14:43  1.25
## 131895 547969           CHILDS GARDEN TROWEL PINK        3 28/03/11 16:27  0.85
## 131896 547969           CHILDS GARDEN TROWEL PINK        3 28/03/11 16:27  0.85
## 134315 548308         SET/6 RED SPOTTY PAPER CUPS        1 30/03/11 12:00  0.65
## 134316 548308         SET/6 RED SPOTTY PAPER CUPS        2 30/03/11 12:00  0.65
## 134363 548309   SET/10 RED POLKADOT PARTY CANDLES        1 30/03/11 12:02  1.25
## 134366 548309             LUNCH BOX I LOVE LONDON        1 30/03/11 12:02  1.95
## 134374 548309                  SPACEBOY GIFT WRAP       25 30/03/11 12:02  0.42
## 134378 548309  SMALL DOLLY MIX DESIGN ORANGE BOWL        2 30/03/11 12:02  0.42
## 134380 548309              6 RIBBONS RUSTIC CHARM        1 30/03/11 12:02  1.65
## 134385 548309   SET/10 RED POLKADOT PARTY CANDLES        1 30/03/11 12:02  1.25
## 134386 548309                        DOGGY RUBBER        1 30/03/11 12:02  0.21
## 134389 548309           PACK OF 12 LONDON TISSUES       12 30/03/11 12:02  0.29
## 134394 548309          FOOD/DRINK SPONGE STICKERS       24 30/03/11 12:02  0.21
## 134401 548309        REX CASH+CARRY JUMBO SHOPPER        1 30/03/11 12:02  0.95
## 134475 548312                   PINK BABY BUNTING        1 30/03/11 12:12  2.95
## 134501 548313          PICNIC BASKET WICKER SMALL        1 30/03/11 12:15  5.95
## 134534 548313        REX CASH+CARRY JUMBO SHOPPER        1 30/03/11 12:15  0.95
## 134696 548327             PACK OF 12 SUKI TISSUES        1 30/03/11 13:05  0.29
## 134698 548327    PACK OF 12 HEARTS DESIGN TISSUES        1 30/03/11 13:05  0.29
## 134700 548327    PACK OF 12 RED RETROSPOT TISSUES        1 30/03/11 13:05  0.29
## 134701 548327            PACK OF 12 SKULL TISSUES        1 30/03/11 13:05  0.29
## 134703 548327     PACK OF 12 PINK PAISLEY TISSUES        1 30/03/11 13:05  0.29
## 134708 548327       GINGERBREAD MAN COOKIE CUTTER        1 30/03/11 13:05  1.25
## 135325 548388      SET/4 SPRING FLOWER DECORATION        4 30/03/11 16:52  2.95
## 135356 548388                TEA FOR ONE POLKADOT        1 30/03/11 16:52  4.25
## 135403 548400       JARDIN ETCHED GLASS FRUITBOWL        1 30/03/11 17:33  3.95
## 135410 548400     JARDIN ETCHED GLASS CHEESE DISH        1 30/03/11 17:33  1.95
## 135721 548451                  VINTAGE SNAP CARDS        3 31/03/11 11:25  0.85
## 135971 548492                 LUNCH BAG CARS BLUE        3 31/03/11 13:14  1.65
## 137019 548544          HEART FILIGREE DOVE  SMALL       24 31/03/11 18:49  1.25
## 137021 548544          HEART FILIGREE DOVE  SMALL       24 31/03/11 18:49  1.25
## 137301 548568                IVORY KITCHEN SCALES        4 01/04/11 10:43  7.65
## 137316 548604        MEASURING TAPE BABUSHKA BLUE        1 01/04/11 10:58  2.95
## 137485 548612        RED RETROSPOT SMALL MILK JUG        2 01/04/11 11:34  2.55
## 137527 548614     TRAVEL CARD WALLET RETRO PETALS        1 01/04/11 11:47  0.42
## 138040 548666      BUFFALO BILL TREASURE BOOK BOX        3 01/04/11 14:58  2.25
## 138049 548666   AIRLINE BAG VINTAGE JET SET BROWN        1 01/04/11 14:58  4.25
## 138079 548666            EASTER TIN BUNNY BOUQUET        6 01/04/11 14:58  1.65
## 138082 548666        EASTER TIN CHICKS PINK DAISY        6 01/04/11 14:58  1.65
## 138098 548666                RED DINER WALL CLOCK        1 01/04/11 14:58  8.50
## 138102 548666          PICNIC BASKET WICKER LARGE        1 01/04/11 14:58  9.95
## 138106 548666    FUNKY WASHING UP GLOVES ASSORTED        4 01/04/11 14:58  2.10
## 138154 548670     60 CAKE CASES DOLLY GIRL DESIGN        1 01/04/11 15:37  0.55
## 138156 548670         60 TEATIME FAIRY CAKE CASES        1 01/04/11 15:37  0.55
## 138168 548670      PACK OF 60 DINOSAUR CAKE CASES        1 01/04/11 15:37  0.55
## 138169 548670      72 SWEETHEART FAIRY CAKE CASES        1 01/04/11 15:37  0.55
## 138174 548670      METAL SIGN TAKE IT OR LEAVE IT        1 01/04/11 15:37  2.95
## 138373 548703     CANDLEHOLDER PINK HANGING HEART        1 03/04/11 11:37  2.95
## 138375 548703           HEART IVORY TRELLIS LARGE        1 03/04/11 11:37  1.65
## 138382 548703              PAPER CHAIN KIT EMPIRE        1 03/04/11 11:37  2.95
## 138384 548703               CHOCOLATE BOX RIBBONS        1 03/04/11 11:37  1.25
## 138386 548703     CANDLEHOLDER PINK HANGING HEART        1 03/04/11 11:37  2.95
## 138388 548703           HEART IVORY TRELLIS SMALL        2 03/04/11 11:37  1.25
## 138401 548703       PACK OF 20 NAPKINS RED APPLES        1 03/04/11 11:37  0.85
## 138471 548708        GLASS JAR DIGESTIVE BISCUITS        1 03/04/11 12:41  2.95
## 138599 548711                   POLKADOT RAIN HAT        1 03/04/11 14:24  0.42
## 138603 548711     S/4 PINK FLOWER CANDLES IN BOWL        1 03/04/11 14:24  1.65
## 138617 548711    PINK BLUE FELT CRAFT TRINKET BOX        1 03/04/11 14:24  1.25
## 138670 548712    SET 3 RETROSPOT TEA,COFFEE,SUGAR        1 03/04/11 14:42  4.95
## 138672 548712                  RED KITCHEN SCALES        1 03/04/11 14:42  8.50
## 138683 548712          SET OF 4 POLKADOT COASTERS        1 03/04/11 14:42  1.25
## 138691 548712  3 TRADITIONAl BISCUIT CUTTERS  SET        1 03/04/11 14:42  2.10
## 138731 548714       ASS FLORAL PRINT SPIRIT LEVEL        1 03/04/11 15:07  1.95
## 138768 548714             VINTAGE RED TEATIME MUG        1 03/04/11 15:07  1.25
## 138784 548714            36 FOIL HEART CAKE CASES        1 03/04/11 15:07  2.10
## 138835 548714                  SALLE DE BAIN HOOK        1 03/04/11 15:07  1.25
## 138840 548714                  SALLE DE BAIN HOOK        1 03/04/11 15:07  1.25
## 139232 548739    RED RETROSPOT TRADITIONAL TEAPOT        1 04/04/11 11:28  7.95
## 139450 548768      SET 2 TEA TOWELS I LOVE LONDON        1 04/04/11 12:34  3.25
## 139499 548792         ZINC METAL HEART DECORATION        1 04/04/11 12:42  1.25
## 139506 548792                 RED RETROSPOT PLATE        1 04/04/11 12:42  1.69
## 139513 548792     PACK OF 72 RETROSPOT CAKE CASES        1 04/04/11 12:42  0.55
## 139528 548792            RED RETROSPOT PICNIC BAG        1 04/04/11 12:42  2.95
## 139732 548860       TRAVEL CARD WALLET UNION JACK        1 04/04/11 13:38  0.42
## 140558 548898 DECORATION WHITE CHICK MAGIC GARDEN        2 04/04/11 16:28  0.85
## 140628 548910             PACK OF 12 SUKI TISSUES      432  05/04/11 8:51  0.20
## 140795 548952   BIRDHOUSE DECORATION MAGIC GARDEN        2 05/04/11 10:46  1.25
## 141035 548983     JARDIN ETCHED GLASS CHEESE DISH        1 05/04/11 12:30  1.95
## 141161 548987         60 TEATIME FAIRY CAKE CASES        2 05/04/11 12:50  0.55
## 141937 549099                 HOME SWEET HOME MUG        3 06/04/11 11:07  1.25
## 142243 549121          RIBBON REEL STRIPES DESIGN        5 06/04/11 13:33  1.65
## 142246 549121              KINGS CHOICE TEA CADDY        1 06/04/11 13:33  2.95
## 142395 549129               EASTER CRAFT 4 CHICKS        4 06/04/11 14:53  1.95
## 142460 549130        PINK UNION JACK  LUGGAGE TAG        1 06/04/11 15:02  1.25
## 142993 549234        SMALL PINK GLASS SUNDAE DISH        6 07/04/11 11:12  0.39
## 143037 549235                  CARD I LOVE LONDON       12 07/04/11 11:16  0.42
## 143412 549251     PACK OF 72 RETROSPOT CAKE CASES        1 07/04/11 12:16  0.55
## 143418 549251        SMALL MARSHMALLOWS PINK BOWL        2 07/04/11 12:16  0.42
## 143468 549257                JUMBO BAG STRAWBERRY        1 07/04/11 12:29  2.08
## 143500 549257                   RED RETROSPOT MUG        1 07/04/11 12:29  2.95
## 143619 549262         HAND WARMER BABUSHKA DESIGN        1 07/04/11 12:38  2.10
## 143638 549262               FELTCRAFT CUSHION OWL        1 07/04/11 12:38  3.75
## 143653 549262          FOUR HOOK  WHITE LOVEBIRDS        1 07/04/11 12:38  2.10
## 143659 549262      PAPER CHAIN KIT 50'S CHRISTMAS        1 07/04/11 12:38  2.95
## 143664 549262            JAM MAKING SET WITH JARS        1 07/04/11 12:38  4.25
## 143729 549275       BLACK MEDIUM GLASS CAKE STAND        2 07/04/11 13:09  0.79
## 143822 549279 JUMBO BAG SCANDINAVIAN BLUE PAISLEY        1 07/04/11 13:16  2.08
## 143838 549279  LUNCH BOX WITH CUTLERY FAIRY CAKES        1 07/04/11 13:16  2.55
## 143843 549279  JARDIN ETCHED GLASS LARGE BELL JAR        1 07/04/11 13:16  3.95
## 143966 549291        WHITE HEART CONFETTI IN TUBE        1 07/04/11 19:05  1.65
## 143970 549291      METAL SIGN,CUPCAKE SINGLE HOOK        1 07/04/11 19:05  1.25
## 143971 549291      METAL SIGN,CUPCAKE SINGLE HOOK        1 07/04/11 19:05  1.25
## 143983 549291               DAIRY MAID STRIPE MUG        1 07/04/11 19:05  0.79
## 144061 549294     ROSES REGENCY TEACUP AND SAUCER        1 07/04/11 19:27  2.95
## 144078 549294           STAR PORTABLE TABLE LIGHT        1 07/04/11 19:27  2.95
## 144832 549368      SMALL YELLOW BABUSHKA NOTEBOOK        1 08/04/11 11:26  0.85
## 144869 549372          WOODEN SKITTLES GARDEN SET        1 08/04/11 11:28 15.95
## 145085 549436               RED  HARMONICA IN BOX       24 08/04/11 12:34  1.25
## 145689 549537        EASTER TIN CHICKS PINK DAISY        1 08/04/11 17:22  1.65
## 145691 549537        EASTER TIN CHICKS PINK DAISY        1 08/04/11 17:22  1.65
## 145694 549537                 APRON APPLE DELIGHT        1 08/04/11 17:22  4.95
## 145785 549543  SET 6 FOOTBALL CELEBRATION CANDLES        1 10/04/11 11:14  1.25
## 146029 549555  MINI WOODEN HAPPY BIRTHDAY GARLAND        1 10/04/11 12:52  1.69
## 146050 549555     PINK CHICK EGG WARMER + EGG CUP        1 10/04/11 12:52  0.85
## 146051 549555    PINK BLUE FELT CRAFT TRINKET BOX        1 10/04/11 12:52  1.25
## 146138 549558             PANTRY WASHING UP BRUSH        1 10/04/11 13:21  1.45
## 146139 549558                 HERB MARKER PARSLEY        1 10/04/11 13:21  0.65
## 146140 549558                  HERB MARKER CHIVES        1 10/04/11 13:21  0.65
## 146141 549558                    HERB MARKER MINT        1 10/04/11 13:21  0.65
## 146292 549566  PACK OF 60 PINK PAISLEY CAKE CASES        1 10/04/11 14:27  0.55
## 146295 549566              JAM MAKING SET PRINTED        1 10/04/11 14:27  1.45
## 146343 549567                 TUMBLER NEW ENGLAND        6 10/04/11 15:07  0.39
## 146386 549568           HEART IVORY TRELLIS LARGE       12 10/04/11 15:09  1.65
## 146634 549575    BEADED CRYSTAL HEART BLUE  LARGE        1 10/04/11 16:04  1.65
## 147289 549690    ASSORTED MONKEY SUCTION CUP HOOK        1 11/04/11 13:41  0.42
## 147312 549690    ASSORTED MONKEY SUCTION CUP HOOK        1 11/04/11 13:41  0.42
## 147447 549714               GRAND CHOCOLATECANDLE        2 11/04/11 14:13  1.45
## 147562 549728     PACK OF 72 RETROSPOT CAKE CASES        2 11/04/11 16:15  0.55
## 147692 549733        PINK UNION JACK  LUGGAGE TAG        2 11/04/11 16:56  1.25
## 148098 549771       BUNNY DECORATION MAGIC GARDEN        1 12/04/11 11:43  0.85
## 148107 549771                 EASTER TIN KEEPSAKE        2 12/04/11 11:43  1.65
## 148124 549771              LOVE HEART SOCK HANGER        1 12/04/11 11:43  1.65
## 148236 549813             CHILDS GARDEN FORK BLUE        1 12/04/11 12:16  0.85
## 148734 549901  KNICKERBOCKERGLORY MAGNET ASSORTED        6 12/04/11 16:17  0.83
## 148735 549901  KNICKERBOCKERGLORY MAGNET ASSORTED        6 12/04/11 16:17  0.83
## 148794 549903         GARLAND WOODEN HAPPY EASTER       12 12/04/11 16:19  1.25
## 148797 549903                 WHITE METAL LANTERN        1 12/04/11 16:19  3.75
## 149157 549943        TRAVEL CARD WALLET KEEP CALM        1 13/04/11 12:09  0.42
## 149176 549943        TRAVEL CARD WALLET TRANSPORT        1 13/04/11 12:09  0.42
## 149178 549943        TRAVEL CARD WALLET KEEP CALM        1 13/04/11 12:09  0.42
## 149185 549943                   VIPPASSPORT COVER        1 13/04/11 12:09  2.10
## 149186 549943     PINK UNION JACK  PASSPORT COVER        1 13/04/11 12:09  2.10
## 149187 549943     PINK UNION JACK  PASSPORT COVER        1 13/04/11 12:09  2.10
## 149191 549943                    BLACK WINE GLASS        6 13/04/11 12:09  0.39
## 149669 549981    TRADITIONAL WOODEN SKIPPING ROPE        1 13/04/11 15:49  1.45
## 149700 549981   VINTAGE HEADS AND TAILS CARD GAME        1 13/04/11 15:49  1.25
## 149711 549981              SPACEBOY BABY GIFT SET        1 13/04/11 15:49 16.95
## 149756 549983 SET 3 PAPER VINTAGE CHICK PAPER EGG        1 13/04/11 15:55  2.95
## 149768 549983       RED TOADSTOOL LED NIGHT LIGHT        1 13/04/11 15:55  1.65
## 150102 550006                   GUMBALL COAT RACK        1 14/04/11 10:10  2.55
## 150689 550130          VINTAGE UNION JACK PENNANT        1 14/04/11 13:17  1.95
## 150865 550138    ASSORTED MONKEY SUCTION CUP HOOK        2 14/04/11 14:02  0.42
## 150866 550138    ASSORTED MONKEY SUCTION CUP HOOK        2 14/04/11 14:02  0.42
## 151451 550191       JARDIN ETCHED GLASS FRUITBOWL        1 14/04/11 19:59  3.95
## 151452 550191            RIDGED GLASS FINGER BOWL        6 14/04/11 19:59  0.39
## 151454 550191    HANGING HEART JAR T-LIGHT HOLDER        6 14/04/11 19:59  1.25
## 151606 550196        STRAWBERRY FAIRY CAKE TEAPOT        1 15/04/11 10:09  4.95
## 152637 550280               LUNCH BAG SUKI DESIGN       10 15/04/11 13:31  1.65
## 152742 550288        HOOK, 1 HANGER ,MAGIC GARDEN        1 15/04/11 14:21  0.85
## 152940 550301         HANGING METAL HEART LANTERN        6 17/04/11 10:15  1.65
## 152942 550301            LOVE BUILDING BLOCK WORD        1 17/04/11 10:15  5.95
## 152943 550301            LOVE BUILDING BLOCK WORD        1 17/04/11 10:15  5.95
## 153072 550312      EMBOSSED GLASS TEALIGHT HOLDER       12 17/04/11 11:18  1.25
## 153259 550320  NOVELTY BISCUITS CAKE STAND 3 TIER        1 17/04/11 12:37  9.95
## 153260 550320 LARGE CAKE STAND  HANGING STRAWBERY        1 17/04/11 12:37  9.95
## 153264 550320  NOVELTY BISCUITS CAKE STAND 3 TIER        1 17/04/11 12:37  9.95
## 153281 550320         LUNCH BAG DOLLY GIRL DESIGN        1 17/04/11 12:37  1.65
## 153283 550320                 LUNCH BAG CARS BLUE        1 17/04/11 12:37  1.65
## 153284 550320               LUNCH BAG SUKI DESIGN        1 17/04/11 12:37  1.65
## 153341 550321   PINK CREAM FELT CRAFT TRINKET BOX        2 17/04/11 12:49  1.25
## 153350 550321             CHILDS GARDEN FORK PINK        1 17/04/11 12:49  0.85
## 153361 550322        SKULL LUNCH BOX WITH CUTLERY        1 17/04/11 12:53  2.55
## 153365 550322         RED RETROSPOT CHARLOTTE BAG        1 17/04/11 12:53  0.85
## 153368 550322      RED WOOLLY HOTTIE WHITE HEART.        1 17/04/11 12:53  3.75
## 153373 550322           RED RETROSPOT SHOPPER BAG        1 17/04/11 12:53  1.25
## 153566 550331         HANGING WOOD AND FELT HEART        1 17/04/11 13:43  0.42
## 153568 550331   LOVEBIRD HANGING DECORATION WHITE        1 17/04/11 13:43  0.85
## 153570 550331         HANGING WOOD AND FELT HEART        1 17/04/11 13:43  0.42
## 153574 550331         HANGING WOOD AND FELT HEART        1 17/04/11 13:43  0.42
## 153578 550331           PACK OF 12 STICKY BUNNIES        1 17/04/11 13:43  0.65
## 153579 550331           PACK OF 12 STICKY BUNNIES        1 17/04/11 13:43  0.65
## 153580 550331         HANGING WOOD AND FELT HEART        1 17/04/11 13:43  0.42
## 153581 550331           PACK OF 12 STICKY BUNNIES        1 17/04/11 13:43  0.65
## 153582 550331 DECORATION WHITE CHICK MAGIC GARDEN        1 17/04/11 13:43  0.85
## 153591 550331          SET OF 5 LUCKY CAT MAGNETS        1 17/04/11 13:43  2.08
## 153658 550331                  LUNCH BAG WOODLAND        1 17/04/11 13:43  1.65
## 153665 550332      METAL SIGN,CUPCAKE SINGLE HOOK        1 17/04/11 13:53  1.25
## 153666 550332      METAL SIGN,CUPCAKE SINGLE HOOK        1 17/04/11 13:53  1.25
## 153702 550332         60 TEATIME FAIRY CAKE CASES        2 17/04/11 13:53  0.55
## 153708 550332              6 RIBBONS RUSTIC CHARM        1 17/04/11 13:53  1.65
## 154013 550352                   GUMBALL COAT RACK        1 18/04/11 10:21  2.55
## 154198 550389               LONDON BUS COFFEE MUG        2 18/04/11 11:53  2.55
## 154402 550447             LUNCH BAG PINK POLKADOT        2 18/04/11 12:36  1.65
## 154798 550459       4 PURPLE FLOCK DINNER CANDLES        1 18/04/11 13:17  2.55
## 154800 550459  MINI WOODEN HAPPY BIRTHDAY GARLAND        1 18/04/11 13:17  1.69
## 154933 550467          PICNIC BASKET WICKER LARGE        1 18/04/11 13:36  9.95
## 155849 550477        FELTCRAFT PRINCESS LOLA DOLL        1 18/04/11 14:01  3.75
## 155907 550477          IVORY PAPER CUP CAKE CASES        1 18/04/11 14:01  0.55
## 155913 550477      PACK OF 60 DINOSAUR CAKE CASES        1 18/04/11 14:01  0.55
## 156116 550493      CHARLOTTE BAG VINTAGE ALPHABET        1 18/04/11 14:50  0.85
## 156826 550512     JUMBO BAG CHARLIE AND LOLA TOYS        1 18/04/11 16:31  2.08
## 156843 550512           LUNCH BAG ALPHABET DESIGN        1 18/04/11 16:31  1.65
## 156870 550512                    LIPSTICK PEN RED        1 18/04/11 16:31  0.42
## 156884 550512    FOLKART ZINC HEART CHRISTMAS DEC        1 18/04/11 16:31  0.85
## 156926 550513 GARDENIA 1 WICK MORRIS BOXED CANDLE        1 18/04/11 16:37  4.25
## 156955 550515           CHILDS GARDEN TROWEL PINK        1 18/04/11 17:29  0.85
## 156994 550515           CARAVAN SQUARE TISSUE BOX        1 18/04/11 17:29  1.25
## 157873 550621             KEY FOB , GARAGE DESIGN        2 19/04/11 13:41  0.65
## 157910 550621                POTTING SHED TEA MUG        1 19/04/11 13:41  1.25
## 157913 550621                 HOME SWEET HOME MUG        1 19/04/11 13:41  1.25
## 158164 550632     IVORY CHANDELIER T-LIGHT HOLDER        1 19/04/11 14:56  6.25
## 158165 550632    BEADED CHANDELIER T-LIGHT HOLDER        1 19/04/11 14:56  4.95
## 158166 550632   FLOWERS CHANDELIER T-LIGHT HOLDER        1 19/04/11 14:56  6.25
## 158175 550632      METAL SIGN NEIGHBOURHOOD WITCH        1 19/04/11 14:56  2.10
## 158177 550632        BEWARE OF THE CAT METAL SIGN        1 19/04/11 14:56  1.69
## 158182 550632   5 HOOK HANGER RED MAGIC TOADSTOOL        1 19/04/11 14:56  1.65
## 158183 550632              OPEN CLOSED METAL SIGN        1 19/04/11 14:56  4.95
## 158184 550632        PLEASE ONE PERSON METAL SIGN        1 19/04/11 14:56  2.10
## 158672 550643                    GOLD WINE GOBLET        4 19/04/11 16:14  0.79
## 158745 550651           CHILDS GARDEN TROWEL PINK        1 19/04/11 16:52  0.85
## 158746 550651     PLASTERS IN TIN VINTAGE PAISLEY        1 19/04/11 16:52  1.65
## 158808 550651                      KEY FOB , SHED        1 19/04/11 16:52  0.65
## 158809 550651  SET/10 PINK POLKADOT PARTY CANDLES        1 19/04/11 16:52  1.25
## 158811 550651      PACK OF 60 DINOSAUR CAKE CASES        1 19/04/11 16:52  0.55
## 159677 550803      72 SWEETHEART FAIRY CAKE CASES        1 20/04/11 15:25  0.55
## 159781 550819     EASTER DECORATION NATURAL CHICK        4 20/04/11 17:37  0.65
## 160124 550835                DOLLY GIRL LUNCH BOX        1 21/04/11 10:52  1.95
## 161116 550957              JUMBO STORAGE BAG SUKI        1 21/04/11 16:37  2.08
## 161658 550989        CHARLIE + LOLA BISCUITS TINS        2 21/04/11 18:22  1.95
## 161755 550994         CREAM SWEETHEART MINI CHEST        2 21/04/11 19:55 12.75
## 162645 551057     CANDLEHOLDER PINK HANGING HEART        2 26/04/11 11:59  2.95
## 162648 551057           SWALLOW SQUARE TISSUE BOX        1 26/04/11 11:59  1.25
## 162650 551057                  GREEN FERN JOURNAL        1 26/04/11 11:59  2.55
## 162709 551059   T-LIGHT HOLDER SWEETHEART HANGING        4 26/04/11 12:08  1.95
## 162766 551088     GREEN REGENCY TEACUP AND SAUCER        6 26/04/11 12:31  2.95
## 162912 551137    GLITTER HANGING BUTTERFLY STRING        1 26/04/11 13:05  2.10
## 163097 551152                HEART T-LIGHT HOLDER        3 26/04/11 14:47  1.45
## 163334 551171      PINK REGENCY TEACUP AND SAUCER        2 26/04/11 16:45  2.95
## 163426 551173      METAL SIGN,CUPCAKE SINGLE HOOK        2 26/04/11 16:54  2.46
## 164035 551270   HAIRCLIPS FORTIES FABRIC ASSORTED       12 27/04/11 12:35  0.65
## 164036 551270                  CARD CIRCUS PARADE       12 27/04/11 12:35  0.42
## 164169 551276              LUNCH BAG APPLE DESIGN        2 27/04/11 13:06  1.65
## 164175 551276       JARDIN ETCHED GLASS FRUITBOWL        1 27/04/11 13:06  3.95
## 164191 551277        RED RETROSPOT SMALL MILK JUG        2 27/04/11 13:06  2.55
## 164208 551277      PACK OF 60 DINOSAUR CAKE CASES        2 27/04/11 13:06  0.55
## 165549 551418                  CARD I LOVE LONDON       12 28/04/11 13:50  0.42
## 165686 551436                      GLAMOROUS  MUG        1 28/04/11 15:13  1.25
## 165781 551440         4 TRADITIONAL SPINNING TOPS        1 28/04/11 15:29  1.45
## 165975 551471           PAPER CHAIN KIT RETROSPOT        1 28/04/11 16:40  2.95
## 165981 551471   SMALL HANGING IVORY/RED WOOD BIRD        1 28/04/11 16:40  0.42
## 166122 551516            VINTAGE SNAKES & LADDERS        1 01/05/11 11:10  3.75
## 166415 551531     ROSES REGENCY TEACUP AND SAUCER        4 01/05/11 13:45  2.95
## 166773 551558      PACK OF 60 DINOSAUR CAKE CASES        1 03/05/11 10:41  0.55
## 166792 551558            BLACK RECORD COVER FRAME        1 03/05/11 10:41  3.75
## 166800 551558              LUNCH BAG APPLE DESIGN        2 03/05/11 10:41  1.65
## 166801 551558               LUNCH BAG SUKI DESIGN        1 03/05/11 10:41  1.65
## 166807 551558     RED RETROSPOT OVEN GLOVE DOUBLE        1 03/05/11 10:41  2.95
## 167017 551616            TOAST ITS - FAIRY FLOWER        1 03/05/11 11:40  1.25
## 167028 551616        REX CASH+CARRY JUMBO SHOPPER        1 03/05/11 11:40  0.95
## 167245 551686                       PARTY BUNTING        3 03/05/11 12:53  4.95
## 167390 551714       JARDIN ETCHED GLASS FRUITBOWL        1 03/05/11 15:15  3.95
## 168010 551739      UNION JACK FLAG PASSPORT COVER        1 04/05/11 10:58  2.10
## 168044 551747      METAL SIGN,CUPCAKE SINGLE HOOK       40 04/05/11 11:00  0.42
## 168177 551776       FRENCH BLUE METAL DOOR SIGN 3        1 04/05/11 11:23  1.25
## 168179 551776       FRIDGE MAGNETS LA VIE EN ROSE        6 04/05/11 11:23  0.85
## 168419 551817                       PARTY BUNTING        1 04/05/11 11:50  4.95
## 168421 551817     CHERRY BLOSSOM DECORATIVE FLASK        1 04/05/11 11:50  3.75
## 168951 551869                   CARD GINGHAM ROSE       12 04/05/11 16:36  0.42
## 169431 551966                   TOY TIDY SPACEBOY        1 05/05/11 13:14  2.10
## 169453 551966      YOU'RE CONFUSING ME METAL SIGN        2 05/05/11 13:14  1.69
## 169576 551982          JAZZ HEARTS PURSE NOTEBOOK       24 05/05/11 13:56  0.85
## 169696 551986             ALUMINIUM STAMPED HEART        4 05/05/11 14:41  2.49
## 172705 552243           TRAVEL CARD WALLET SKULLS        1 06/05/11 19:37  0.42
## 172778 552251     MAKE YOUR OWN PLAYTIME CARD KIT        1 06/05/11 20:00  2.95
## 172866 552259      PINK REGENCY TEACUP AND SAUCER        1 08/05/11 11:13  2.95
## 172957 552265        POPPY'S PLAYHOUSE LIVINGROOM        1 08/05/11 11:41  2.10
## 172964 552265              LUNCH BAG APPLE DESIGN        2 08/05/11 11:41  1.65
## 172980 552265        FELTCRAFT PRINCESS LOLA DOLL        1 08/05/11 11:41  3.75
## 172982 552265   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 08/05/11 11:41  3.75
## 173014 552267   FLOWERS CHANDELIER T-LIGHT HOLDER        1 08/05/11 11:49  6.25
## 173026 552267     CREAM WALL PLANTER HEART SHAPED        1 08/05/11 11:49  5.95
## 173068 552269     HEART DECORATION RUSTIC HANGING        1 08/05/11 11:52  0.65
## 173084 552269                HERB MARKER ROSEMARY        1 08/05/11 11:52  0.65
## 173095 552269                HERB MARKER ROSEMARY        1 08/05/11 11:52  0.65
## 173216 552277      IVORY GIANT GARDEN THERMOMETER        1 08/05/11 12:34  5.95
## 173221 552277        REX CASH+CARRY JUMBO SHOPPER        1 08/05/11 12:34  0.95
## 173233 552277       BALLOON WATER BOMB PACK OF 35        1 08/05/11 12:34  0.42
## 173235 552277     RETROSPOT RED WASHING UP GLOVES        1 08/05/11 12:34  2.10
## 173236 552277        CITRONELLA CANDLE GARDEN POT        6 08/05/11 12:34  1.25
## 173246 552277      IVORY GIANT GARDEN THERMOMETER        1 08/05/11 12:34  5.95
## 173247 552277    HANGING HEART JAR T-LIGHT HOLDER        6 08/05/11 12:34  1.25
## 173248 552277         CITRONELLA CANDLE FLOWERPOT        4 08/05/11 12:34  2.10
## 173250 552277        FULL ENGLISH BREAKFAST PLATE        1 08/05/11 12:34  3.75
## 173374 552282   DOORMAT UNION JACK GUNS AND ROSES        1 08/05/11 12:44  7.95
## 173384 552282                FELTCRAFT DOLL EMILY        1 08/05/11 12:44  2.95
## 173419 552285   JUNGLE POPSICLES ICE LOLLY MOULDS        1 08/05/11 12:58  1.25
## 173432 552285              HARDMAN MUG 3 ASSORTED        1 08/05/11 12:58  0.39
## 173444 552285  FELTCRAFT HAIRBANDS PINK AND WHITE        1 08/05/11 12:58  0.85
## 173452 552285                 HAPPY STENCIL CRAFT        1 08/05/11 12:58  1.25
## 173454 552285                   FINE WICKER HEART        2 08/05/11 12:58  1.25
## 173460 552285               BALLOONS  WRITING SET        1 08/05/11 12:58  1.65
## 173461 552285           PAINT YOUR OWN CANVAS SET        1 08/05/11 12:58  1.65
## 173485 552285     PINK FAIRY CAKE CHILDRENS APRON        1 08/05/11 12:58  1.95
## 173487 552285              STRAWBERRY BATH SPONGE        1 08/05/11 12:58  1.25
## 173492 552285   SET OF 3 BUTTERFLY COOKIE CUTTERS        1 08/05/11 12:58  1.25
## 173493 552285       SET OF 3 HEART COOKIE CUTTERS        1 08/05/11 12:58  1.25
## 173504 552285         60 TEATIME FAIRY CAKE CASES        1 08/05/11 12:58  0.55
## 173505 552285      PACK OF 60 MUSHROOM CAKE CASES        1 08/05/11 12:58  0.55
## 173509 552285         PACK OF 72 SKULL CAKE CASES        1 08/05/11 12:58  0.55
## 173511 552285     PACK OF 72 RETROSPOT CAKE CASES        1 08/05/11 12:58  0.55
## 173513 552285      72 SWEETHEART FAIRY CAKE CASES        1 08/05/11 12:58  0.55
## 173514 552285      PACK OF 60 DINOSAUR CAKE CASES        1 08/05/11 12:58  0.55
## 173515 552285     60 CAKE CASES DOLLY GIRL DESIGN        1 08/05/11 12:58  0.55
## 173524 552285        SKULL LUNCH BOX WITH CUTLERY        1 08/05/11 12:58  2.55
## 173531 552285              ALPHABET STENCIL CRAFT        1 08/05/11 12:58  1.25
## 173534 552285             LAVENDER INCENSE IN TIN        1 08/05/11 12:58  0.38
## 173536 552285      SET OF 6 3D KIT CARDS FOR KIDS        1 08/05/11 12:58  0.85
## 173545 552285           CHARLOTTE BAG SUKI DESIGN        1 08/05/11 12:58  0.85
## 173550 552285                  KIDS RAIN MAC PINK        1 08/05/11 12:58  0.85
## 173567 552286             LUNCH BAG PINK POLKADOT        1 08/05/11 13:07  1.65
## 173568 552286             LUNCH BAG PINK POLKADOT        1 08/05/11 13:07  1.65
## 173640 552290                    JAM CLOCK MAGNET        2 08/05/11 13:32  2.89
## 173764 552295   S/6 WOODEN SKITTLES IN COTTON BAG        1 08/05/11 14:08  3.25
## 173812 552296     SET/20 STRAWBERRY PAPER NAPKINS        2 08/05/11 14:09  0.85
## 173953 552307   WOODEN PICTURE FRAME WHITE FINISH        1 08/05/11 15:20  2.55
## 174017 552310       SET OF 20 KIDS COOKIE CUTTERS        1 08/05/11 15:22  2.10
## 174023 552310       BALLOON WATER BOMB PACK OF 35       10 08/05/11 15:22  0.42
## 174193 552318              6 RIBBONS RUSTIC CHARM        2 08/05/11 16:13  1.65
## 174727 552376             DOORMAT WELCOME PUPPIES        1 09/05/11 12:30  7.95
## 174793 552442        CHILDRENS CUTLERY DOLLY GIRL        2 09/05/11 13:03  4.15
## 176840 552651                 ROSE DU SUD WASHBAG        1 10/05/11 14:09  5.95
## 176842 552651           ROSE DU SUD COSMETICS BAG        1 10/05/11 14:09  4.25
## 176877 552652 SET/5 RED RETROSPOT LID GLASS BOWLS        1 10/05/11 14:09  2.95
## 176879 552652          WOODEN ROUNDERS GARDEN SET        1 10/05/11 14:09  9.95
## 176887 552652         SKULL DESIGN TV DINNER TRAY        2 10/05/11 14:09  4.95
## 176892 552652 SET/5 RED RETROSPOT LID GLASS BOWLS        1 10/05/11 14:09  2.95
## 176901 552652                SMALL POPCORN HOLDER        6 10/05/11 14:09  0.85
## 176903 552652     12 MESSAGE CARDS WITH ENVELOPES        1 10/05/11 14:09  1.65
## 176904 552652           ENCHANTED BIRD PLANT CAGE        1 10/05/11 14:09  3.75
## 176906 552652          WOODEN ROUNDERS GARDEN SET        1 10/05/11 14:09  9.95
## 176950 552654                       PARTY BUNTING        1 10/05/11 14:20  4.95
## 178448 552703           HOUSE WRECKING METAL SIGN        1 10/05/11 16:00  2.10
## 178944 552803     PINK FAIRY CAKE CHILDRENS APRON        1 11/05/11 12:32  1.95
## 179195 552821      72 SWEETHEART FAIRY CAKE CASES        1 11/05/11 12:58  0.55
## 179438 552826                HOT BATHS METAL SIGN        4 11/05/11 13:20  2.10
## 179489 552828           LUNCH BAG ALPHABET DESIGN       10 11/05/11 13:23  1.65
## 179639 552839                  DOORMAT FAIRY CAKE        1 11/05/11 14:25  7.95
## 179685 552843        PLEASE ONE PERSON METAL SIGN        1 11/05/11 14:37  2.10
## 179806 552852       CHILDRENS APRON APPLES DESIGN        1 11/05/11 15:08  1.95
## 180695 552949          FOUR HOOK  WHITE LOVEBIRDS        1 12/05/11 12:01  2.10
## 181301 553004              JUMBO BAG VINTAGE LEAF       10 12/05/11 16:11  2.08
## 181302 553004         WRAP VINTAGE PETALS  DESIGN       25 12/05/11 16:11  0.42
## 181339 553005    PACK OF 20 NAPKINS PANTRY DESIGN        1 12/05/11 16:29  0.85
## 181633 553013      METAL SIGN,CUPCAKE SINGLE HOOK        1 12/05/11 18:19  2.46
## 181771 553014                       PARTY BUNTING        1 12/05/11 18:49  4.95
## 181780 553014             TOADSTOOL BEDSIDE LIGHT        1 12/05/11 18:49  8.95
## 181795 553014         BLUE & WHITE BREAKFAST TRAY        1 12/05/11 18:49  2.95
## 181801 553015          RETRO COFFEE MUGS ASSORTED        1 12/05/11 18:55  1.25
## 181912 553034  MIRROR MOSAIC T-LIGHT HOLDER ROUND        6 12/05/11 20:03  1.65
## 181917 553034  MIRROR MOSAIC T-LIGHT HOLDER ROUND        6 12/05/11 20:03  1.65
## 182018 553035   ZINC HEART LATTICE T-LIGHT HOLDER        1 12/05/11 20:13  1.25
## 182042 553035         MAGIC DRAWING SLATE BUNNIES        1 12/05/11 20:13  0.42
## 182279 553054               LONDON BUS COFFEE MUG        6 13/05/11 10:22  2.55
## 182308 553057                JUMBO BAG STRAWBERRY       10 13/05/11 10:41  2.08
## 182383 553061             LUNCH BAG  BLACK SKULL.        1 13/05/11 11:12  1.65
## 182677 553129            JAM MAKING SET WITH JARS        1 13/05/11 12:34  4.25
## 182792 553141    PACK OF 20 NAPKINS PANTRY DESIGN        1 13/05/11 13:01  0.85
## 182804 553141              RED RETROSPOT UMBRELLA        1 13/05/11 13:01  5.95
## 182808 553141            CHILDS GARDEN SPADE BLUE        1 13/05/11 13:01  2.10
## 182809 553141             CHILDS GARDEN RAKE BLUE        1 13/05/11 13:01  2.10
## 182813 553141                 DOORMAT NEW ENGLAND        1 13/05/11 13:01  7.95
## 182814 553141     VICTORIAN GLASS HANGING T-LIGHT        4 13/05/11 13:01  1.25
## 182821 553141           JUMBO BAG DOILEY PATTERNS        2 13/05/11 13:01  2.08
## 183296 553162      METAL SIGN,CUPCAKE SINGLE HOOK        1 13/05/11 15:53  2.46
## 183706 553182      SET OF 72 SKULL PAPER  DOILIES        1 15/05/11 12:21  1.45
## 183778 553184                RED DINER WALL CLOCK        1 15/05/11 12:33  8.50
## 183895 553189      METAL SIGN,CUPCAKE SINGLE HOOK        3 15/05/11 13:14  1.25
## 184171 553199            RED RETROSPOT PICNIC BAG        1 15/05/11 15:14  2.95
## 185952 553423             NO JUNK MAIL METAL SIGN        1 17/05/11 10:28  1.25
## 186230 553485   FLOWERS CHANDELIER T-LIGHT HOLDER        1 17/05/11 12:25  6.25
## 186262 553487   JUMBO SHOPPER VINTAGE RED PAISLEY        1 17/05/11 12:38  2.08
## 186309 553488   PINK CREAM FELT CRAFT TRINKET BOX        1 17/05/11 12:40  1.25
## 186310 553488         BOX OF 24 COCKTAIL PARASOLS        1 17/05/11 12:40  0.42
## 186558 553520   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 17/05/11 14:32  3.75
## 186573 553521       FRENCH BLUE METAL DOOR SIGN 9        2 17/05/11 14:35  0.00
## 187486 553553              JUMBO BAG VINTAGE LEAF       10 17/05/11 16:32  1.95
## 187499 553553                WRAP ALPHABET DESIGN       25 17/05/11 16:32  0.42
## 187707 553576     BLUE POLKADOT WASHING UP GLOVES        6 18/05/11 10:29  2.10
## 187708 553576               PEG BAG APPLES DESIGN        6 18/05/11 10:29  2.55
## 187855 553657     FOOD CONTAINER SET 3 LOVE HEART        1 18/05/11 11:28  1.95
## 187858 553657             LUNCH BAG  BLACK SKULL.        1 18/05/11 11:28  1.65
## 187861 553657     FOOD CONTAINER SET 3 LOVE HEART        1 18/05/11 11:28  1.95
## 187862 553657  SMALL DOLLY MIX DESIGN ORANGE BOWL        2 18/05/11 11:28  0.42
## 187863 553657        SMALL MARSHMALLOWS PINK BOWL        2 18/05/11 11:28  0.42
## 187864 553657                SMALL POPCORN HOLDER        2 18/05/11 11:28  0.85
## 187867 553657     LARGE CAKE STAND HANGING HEARTS        1 18/05/11 11:28  3.95
## 187872 553657     PINK VINTAGE PAISLEY PICNIC BAG        1 18/05/11 11:28  1.65
## 187874 553657            LOVE BUILDING BLOCK WORD        1 18/05/11 11:28  5.95
## 187880 553657     LARGE CAKE STAND HANGING HEARTS        1 18/05/11 11:28  3.95
## 187886 553657   STRAWBERRY LUNCH BOX WITH CUTLERY        1 18/05/11 11:28  2.55
## 187887 553657     FOOD CONTAINER SET 3 LOVE HEART        1 18/05/11 11:28  1.95
## 187891 553657             LUNCH BAG PINK POLKADOT        1 18/05/11 11:28  1.65
## 187895 553657                  DOORMAT FAIRY CAKE        1 18/05/11 11:28  7.95
## 188138 553673 CLEAR DRAWER KNOB ACRYLIC EDWARDIAN       12 18/05/11 12:46  1.25
## 188232 553680                LANTERN CREAM GAZEBO        4 18/05/11 13:11  4.95
## 188241 553680            HOME BUILDING BLOCK WORD        1 18/05/11 13:11  5.95
## 188887 553731       LUNCH BAG VINTAGE LEAF DESIGN       10  19/05/11 8:26  1.65
## 189749 553856         TEA BAG PLATE RED RETROSPOT        1 19/05/11 13:28  0.85
## 189752 553856  SET OF 6 GIRLS CELEBRATION CANDLES        1 19/05/11 13:28  1.25
## 189753 553856  SET 6 FOOTBALL CELEBRATION CANDLES        1 19/05/11 13:28  1.25
## 189757 553856                PIGGY BANK RETROSPOT        1 19/05/11 13:28  2.55
## 189760 553856     PACK OF 72 RETROSPOT CAKE CASES        1 19/05/11 13:28  0.55
## 189771 553856            RED RETROSPOT TISSUE BOX        1 19/05/11 13:28  1.25
## 189779 553856         60 TEATIME FAIRY CAKE CASES        1 19/05/11 13:28  0.55
## 189781 553856       CERAMIC STRAWBERRY DESIGN MUG        1 19/05/11 13:28  1.49
## 189784 553856            ALARM CLOCK BAKELIKE RED        1 19/05/11 13:28  3.75
## 189791 553856      METAL SIGN,CUPCAKE SINGLE HOOK        1 19/05/11 13:28  1.25
## 189792 553856      HANGING PHOTO CLIP ROPE LADDER        1 19/05/11 13:28  1.65
## 190855 553935                 GREEN POLKADOT BOWL       12 20/05/11 10:32  1.25
## 190868 553935  MINI CAKE STAND  HANGING STRAWBERY        1 20/05/11 10:32  1.65
## 190869 553935  MINI CAKE STAND WITH HANGING CAKES        1 20/05/11 10:32  1.45
## 190871 553935   CERAMIC CAKE BOWL + HANGING CAKES        1 20/05/11 10:32  2.95
## 190874 553935        ENAMEL PINK COFFEE CONTAINER        1 20/05/11 10:32  0.83
## 190879 553935           ENAMEL PINK TEA CONTAINER        1 20/05/11 10:32  0.83
## 190882 553935                HOT BATHS METAL SIGN       12 20/05/11 10:32  2.10
## 190886 553935                HOT BATHS METAL SIGN       12 20/05/11 10:32  2.10
## 190887 553935      HAND OVER THE CHOCOLATE   SIGN       12 20/05/11 10:32  2.10
## 190888 553935           COOK WITH WINE METAL SIGN       12 20/05/11 10:32  2.08
## 191259 554016     3 TIER CAKE TIN GREEN AND CREAM        1 20/05/11 13:14 14.95
## 191813 554066            SMALL HEART FLOWERS HOOK       24 22/05/11 10:40  0.85
## 192234 554088  CHOCOLATE 1 WICK MORRIS BOX CANDLE        6 22/05/11 12:12  4.25
## 192499 554098               WHITE WIRE EGG HOLDER        1 22/05/11 13:01  7.50
## 192509 554098                      SPOTTY BUNTING        4 22/05/11 13:01  4.95
## 192586 554098 BIRDCAGE DECORATION TEALIGHT HOLDER        6 22/05/11 13:01  1.25
## 192588 554098              VINTAGE EMBOSSED HEART        6 22/05/11 13:01  1.25
## 192661 554098                     CARD DOLLY GIRL       12 22/05/11 13:01  0.42
## 192663 554098             TEA PARTY BIRTHDAY CARD       12 22/05/11 13:01  0.42
## 192678 554098              BANQUET BIRTHDAY  CARD       12 22/05/11 13:01  0.42
## 192679 554098                   CARD CAT AND TREE       12 22/05/11 13:01  0.42
## 192799 554102       CERAMIC STRAWBERRY DESIGN MUG        2 22/05/11 13:40  1.49
## 192803 554102  3 PIECE SPACEBOY COOKIE CUTTER SET        2 22/05/11 13:40  2.10
## 192953 554105                  SALLE DE BAIN HOOK        1 22/05/11 14:04  1.25
## 193034 554108         GIN + TONIC DIET METAL SIGN        1 22/05/11 14:29  2.55
## 193084 554112            PINK SWEETHEART BRACELET        1 22/05/11 14:44  4.25
## 193143 554112                   BLUE OWL SOFT TOY        1 22/05/11 14:44  2.95
## 193173 554114  FAIRY CAKE FLANNEL ASSORTED COLOUR        1 22/05/11 15:00  2.55
## 193637 554151     BOYS VINTAGE TIN SEASIDE BUCKET        8 23/05/11 11:07  2.55
## 193725 554151         LUNCH BAG DOLLY GIRL DESIGN       10 23/05/11 11:07  1.65
## 193748 554157               RED RETROSPOT PEG BAG        1 23/05/11 11:33  2.55
## 193749 554157               TEA TIME DES TEA COSY        1 23/05/11 11:33  2.55
## 193750 554157               PEG BAG APPLES DESIGN        1 23/05/11 11:33  2.55
## 193761 554157       LUNCH BAG VINTAGE LEAF DESIGN        1 23/05/11 11:33  1.65
## 193762 554157             LUNCH BAG PINK POLKADOT        1 23/05/11 11:33  1.65
## 193763 554157           LUNCH BAG SPACEBOY DESIGN        1 23/05/11 11:33  1.65
## 193765 554157           LUNCH BAG ALPHABET DESIGN        1 23/05/11 11:33  1.65
## 193839 554160      TRIPLE HOOK ANTIQUE IVORY ROSE        1 23/05/11 11:49  3.29
## 193981 554202 CERAMIC BOWL WITH STRAWBERRY DESIGN        2 23/05/11 12:14  2.95
## 194252 554278      TRIPLE HOOK ANTIQUE IVORY ROSE        1 23/05/11 13:25  3.29
## 194264 554278       MONEY BOX POCKET MONEY DESIGN        1 23/05/11 13:25  1.25
## 194735 554323        TRAVEL CARD WALLET KEEP CALM       24 23/05/11 15:33  0.42
## 195296 554382    GARDENERS KNEELING PAD KEEP CALM        1 24/05/11 11:55  1.65
## 197106 554644             JUMBO BAG PINK POLKADOT        1 25/05/11 12:34  2.08
## 197564 554684     CANDLEHOLDER PINK HANGING HEART        2 25/05/11 16:28  2.95
## 197800 554695             JUMBO BAG PINK POLKADOT        3 25/05/11 17:12  2.08
## 199027 554917          BREAD BIN DINER STYLE MINT        1 27/05/11 12:29 16.95
## 199028 554917          BREAD BIN DINER STYLE PINK        1 27/05/11 12:29 16.95
## 199042 554918       PAPER BUNTING VINTAGE PAISLEY        1 27/05/11 12:29  2.95
## 199146 554933          SWEETHEART WIRE FRUIT BOWL        1 27/05/11 13:26  8.50
## 199336 554942  WHITE SPOT RED CERAMIC DRAWER KNOB        6 27/05/11 14:01  1.25
## 199827 554964 BIRDCAGE DECORATION TEALIGHT HOLDER        1 27/05/11 15:57  1.25
## 200028 554980                FELTCRAFT DOLL EMILY        1 29/05/11 11:59  2.95
## 200029 554980   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 29/05/11 11:59  3.75
## 200030 554980                FELTCRAFT DOLL ROSIE        1 29/05/11 11:59  2.95
## 200071 554981           LUNCH BAG SPACEBOY DESIGN        1 29/05/11 12:06  1.65
## 200072 554981               LUNCH BAG SUKI DESIGN        1 29/05/11 12:06  1.65
## 200073 554981                 LUNCH BAG CARS BLUE        1 29/05/11 12:06  1.65
## 200202 554989         BLUE & WHITE BREAKFAST TRAY        2 29/05/11 13:50  2.95
## 200207 554989  RECYCLED PENCIL WITH RABBIT ERASER       36 29/05/11 13:50  0.21
## 200272 554992               BALLOONS  WRITING SET        1 29/05/11 14:08  1.65
## 200281 554992   PINK CREAM FELT CRAFT TRINKET BOX        1 29/05/11 14:08  1.25
## 200282 554992           WOODEN OWLS LIGHT GARLAND        1 29/05/11 14:08  4.25
## 200308 554992   ROUND SNACK BOXES SET OF 4 FRUITS        1 29/05/11 14:08  2.95
## 200316 554992          WATERING CAN BLUE ELEPHANT        1 29/05/11 14:08  1.95
## 200317 554992             WATERING CAN PINK BUNNY        1 29/05/11 14:08  1.95
## 200323 554992       SET OF 20 KIDS COOKIE CUTTERS        1 29/05/11 14:08  2.10
## 200369 554993           RED RETROSPOT SHOPPER BAG        5 29/05/11 14:13  1.25
## 200412 554994            RETROSPOT LARGE MILK JUG        1 29/05/11 14:18  4.95
## 200633 555012 CLEAR DRAWER KNOB ACRYLIC EDWARDIAN       12 31/05/11 10:43  1.25
## 200635 555012 CLEAR DRAWER KNOB ACRYLIC EDWARDIAN       12 31/05/11 10:43  1.25
## 200818 555091                    JUMBO BAG APPLES        2 31/05/11 12:50  2.08
## 201052 555108    SMALL IVORY HEART WALL ORGANISER        2 31/05/11 14:18  5.75
## 201111 555110   SMALL HANGING IVORY/RED WOOD BIRD        1 31/05/11 14:34  0.42
## 201123 555110               LUNCH BAG SUKI DESIGN        1 31/05/11 14:34  1.65
## 201153 555110       FRENCH BLUE METAL DOOR SIGN 1        1 31/05/11 14:34  1.25
## 201154 555110      FRENCH LAUNDRY SIGN BLUE METAL        1 31/05/11 14:34  1.65
## 201161 555110                  RABBIT NIGHT LIGHT        1 31/05/11 14:34  2.08
## 201167 555110           PACK OF 12 LONDON TISSUES        1 31/05/11 14:34  0.29
## 201348 555124      PACK OF 60 DINOSAUR CAKE CASES        1 31/05/11 15:26  0.55
## 201356 555124      PACK OF 60 DINOSAUR CAKE CASES        1 31/05/11 15:26  0.55
## 201358 555124      OFFICE MUG WARMER BLACK+SILVER        1 31/05/11 15:26  2.95
## 201365 555124           PAPER CHAIN KIT RETROSPOT        1 31/05/11 15:26  2.95
## 201378 555124      CERAMIC CHERRY CAKE MONEY BANK        1 31/05/11 15:26  1.45
## 201946 555162                     WRAP RED APPLES       25 01/06/11 10:15  0.42
## 202096 555202      METAL SIGN,CUPCAKE SINGLE HOOK        1 01/06/11 12:11  1.25
## 204198 555383              EIGHT PIECE SNAKE  SET        2 02/06/11 15:13  1.25
## 204202 555383                   PINK BABY BUNTING        5 02/06/11 15:13  2.95
## 204756 555406         CITRONELLA CANDLE FLOWERPOT        4 02/06/11 19:50  2.10
## 204828 555413           LUNCH BAG ALPHABET DESIGN        1  03/06/11 9:50  1.65
## 205046 555473             LUNCH BAG PINK POLKADOT       10 03/06/11 11:59  1.65
## 205637 555515                  RED KITCHEN SCALES        1 05/06/11 10:47  8.50
## 205651 555515            RETROSPOT LARGE MILK JUG        1 05/06/11 10:47  4.95
## 205652 555515            RETROSPOT LARGE MILK JUG        1 05/06/11 10:47  4.95
## 205818 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205819 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205820 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205821 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205822 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205823 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205824 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205826 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205827 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205828 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205829 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205830 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205831 555524     GREEN REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205832 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205833 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205835 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205836 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205837 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205838 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205839 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205840 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205841 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205842 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205843 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205844 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205845 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205846 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205847 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205848 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205849 555524      PINK REGENCY TEACUP AND SAUCER        1 05/06/11 11:37  2.95
## 205850 555524                REGENCY TEAPOT ROSES        1 05/06/11 11:37  9.95
## 205852 555524             REGENCY TEA PLATE ROSES       12 05/06/11 11:37  1.65
## 205868 555524         SWEETHEART CAKESTAND 3 TIER        1 05/06/11 11:37  9.95
## 205880 555524               RED RETROSPOT PEG BAG        1 05/06/11 11:37  2.55
## 205938 555533              OPEN CLOSED METAL SIGN        2 05/06/11 12:12  4.95
## 205942 555533                    PARTY METAL SIGN        1 05/06/11 12:12  1.45
## 205997 555537                      KEY FOB , SHED        1 05/06/11 12:37  0.65
## 206016 555537          FELTCRAFT 6 FLOWER FRIENDS        1 05/06/11 12:37  2.10
## 206083 555541            JAM MAKING SET WITH JARS        1 05/06/11 12:51  4.25
## 206303 555552                  SOAP DISH BROCANTE        1 05/06/11 13:44  2.95
## 206442 555558              LUNCH BAG APPLE DESIGN        2 05/06/11 14:06  1.65
## 206443 555558             LUNCH BAG PINK POLKADOT        1 05/06/11 14:06  1.65
## 206444 555558     PINK VINTAGE PAISLEY PICNIC BAG        1 05/06/11 14:06  1.65
## 206534 555560         BLUE & WHITE BREAKFAST TRAY        1 05/06/11 14:20  2.95
## 206538 555560       MINI  ZINC GARDEN DECORATIONS       12 05/06/11 14:20  0.29
## 206564 555560              LUNCH BAG APPLE DESIGN        1 05/06/11 14:20  1.65
## 206567 555560             LUNCH BAG RED RETROSPOT        1 05/06/11 14:20  1.65
## 206568 555560             LUNCH BOX I LOVE LONDON        1 05/06/11 14:20  1.95
## 206577 555560    AGED GLASS SILVER T-LIGHT HOLDER       12 05/06/11 14:20  0.65
## 206646 555562         SMALL RED BABUSHKA NOTEBOOK        1 05/06/11 14:45  0.85
## 206674 555564     CHARLOTTE BAG DOLLY GIRL DESIGN       10 05/06/11 15:01  0.85
## 207022 555573  PEARL CRYSTAL PUMPKIN T-LIGHT HLDR        6 05/06/11 15:46  1.65
## 208127 555725    3 HOOK PHOTO SHELF ANTIQUE WHITE        2 06/06/11 16:23  8.50
## 208215 555728        STRAWBERRY FAIRY CAKE TEAPOT        1 06/06/11 16:41  4.95
## 208495 555746               RED METAL BEACH SPADE        1 07/06/11 10:55  1.25
## 208700 555835    VINTAGE UNION JACK CUSHION COVER        3 07/06/11 12:34  4.95
## 208737 555835   SET/10 RED POLKADOT PARTY CANDLES        1 07/06/11 12:34  1.25
## 208750 555835    VINTAGE UNION JACK CUSHION COVER        3 07/06/11 12:34  4.95
## 208753 555835                REGENCY TEAPOT ROSES        1 07/06/11 12:34  9.95
## 208823 555841            JAZZ HEARTS ADDRESS BOOK        1 07/06/11 12:47  0.19
## 208966 555845                POTTING SHED TEA MUG        1 07/06/11 13:19  1.25
## 208970 555845                 HOME SWEET HOME MUG        1 07/06/11 13:19  1.25
## 208974 555845         4 TRADITIONAL SPINNING TOPS        1 07/06/11 13:19  1.45
## 209036 555847       CHILDRENS APRON APPLES DESIGN        8 07/06/11 13:27  1.95
## 209262 555853    CHERRY BLOSSOM  DECORATIVE FLASK        1 07/06/11 13:44  3.75
## 209276 555853          ZINC HERB GARDEN CONTAINER        1 07/06/11 13:44  6.25
## 209278 555853    CHERRY BLOSSOM  DECORATIVE FLASK        1 07/06/11 13:44  3.75
## 209279 555853  SET/3 RED GINGHAM ROSE STORAGE BOX        1 07/06/11 13:44  3.75
## 209282 555853  MINI WOODEN HAPPY BIRTHDAY GARLAND        1 07/06/11 13:44  1.69
## 209285 555853      SET OF 6 3D KIT CARDS FOR KIDS        1 07/06/11 13:44  0.85
## 209286 555853     HEART DECORATION RUSTIC HANGING        1 07/06/11 13:44  0.19
## 209292 555853     HEART DECORATION RUSTIC HANGING        1 07/06/11 13:44  0.19
## 209298 555853     IVORY HANGING DECORATION  HEART        2 07/06/11 13:44  0.85
## 209316 555854          WHITE BELL HONEYCOMB PAPER        1 07/06/11 13:47  1.65
## 209333 555854     ROSES REGENCY TEACUP AND SAUCER        1 07/06/11 13:47  2.95
## 209334 555854     GREEN REGENCY TEACUP AND SAUCER        1 07/06/11 13:47  2.95
## 209338 555854   GLASS JAR DAISY FRESH COTTON WOOL        1 07/06/11 13:47  2.95
## 209368 555855                     PHOTO CLIP LINE        1 07/06/11 13:56  1.25
## 209407 555856    ENCHANTED BIRD COATHANGER 5 HOOK        1 07/06/11 14:02  4.65
## 210467 555979               HEART OF WICKER LARGE        2 08/06/11 11:18  2.95
## 210792 556042             JUMBO BAG PINK POLKADOT       10 08/06/11 12:44  2.08
## 211008 556056             LUNCH BAG RED RETROSPOT        1 08/06/11 13:35  1.65
## 211009 556056            LUNCH BAG DOILEY PATTERN        2 08/06/11 13:35  1.65
## 211026 556056      PACK OF 60 DINOSAUR CAKE CASES        2 08/06/11 13:35  0.55
## 211155 556067        VINTAGE UNION JACK MEMOBOARD        1 08/06/11 14:35  9.95
## 211162 556067        VINTAGE UNION JACK MEMOBOARD        1 08/06/11 14:35  9.95
## 211164 556067                       PARTY BUNTING        1 08/06/11 14:35  4.95
## 211798 556093      METAL SIGN,CUPCAKE SINGLE HOOK        1 08/06/11 15:26  2.46
## 211799 556093      METAL SIGN,CUPCAKE SINGLE HOOK        1 08/06/11 15:26  2.46
## 211977 556103            TREASURE ISLAND BOOK BOX        1 08/06/11 16:18  2.25
## 212102 556107               FRYING PAN UNION FLAG        1 08/06/11 17:09  4.25
## 212107 556107     SCANDINAVIAN PAISLEY PICNIC BAG        1 08/06/11 17:09  1.65
## 212134 556107          CHILDRENS CUTLERY SPACEBOY        1 08/06/11 17:09  4.15
## 212406 556112        T-LIGHT GLASS FLUTED ANTIQUE       12  09/06/11 9:28  1.25
## 213685 556245        JINGLE BELL HEART DECORATION        2 09/06/11 16:10  1.65
## 213796 556252         SET/6 RED SPOTTY PAPER CUPS       12 09/06/11 16:44  0.65
## 213797 556252   HANGING HEART ZINC T-LIGHT HOLDER       12 09/06/11 16:44  0.85
## 213976 556263           TREASURE TIN BUFFALO BILL        1 09/06/11 18:41  2.08
## 214079 556280    SET OF 2 TINS JARDIN DE PROVENCE        1 09/06/11 20:03  4.95
## 214080 556280      SET OF 2 TINS VINTAGE BATHROOM        1 09/06/11 20:03  4.25
## 215224 556465                      DOORMAT HEARTS        1 12/06/11 11:04  7.95
## 215328 556473           VINTAGE BILLBOARD TEA MUG        1 12/06/11 12:00  1.25
## 215344 556473             VINTAGE RED TEATIME MUG        1 12/06/11 12:00  1.25
## 215389 556473            ALARM CLOCK BAKELIKE RED        1 12/06/11 12:00  3.75
## 215599 556481      TOILET SIGN OCCUPIED OR VACANT        3 12/06/11 13:00  0.83
## 215718 556484   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 12/06/11 13:17  3.75
## 215719 556484        FELTCRAFT PRINCESS LOLA DOLL        1 12/06/11 13:17  3.75
## 215745 556484          ENAMEL MEASURING JUG CREAM        1 12/06/11 13:17  4.25
## 215798 556484     RETROSPOT TEA SET CERAMIC 11 PC        1 12/06/11 13:17  4.95
## 215808 556484          FRENCH ENAMEL CANDLEHOLDER        1 12/06/11 13:17  2.10
## 215835 556484  ROUND SNACK BOXES SET OF4 WOODLAND        2 12/06/11 13:17  2.95
## 215915 556487                JUMBO BAG STRAWBERRY        1 12/06/11 13:51  2.08
## 215929 556487      SILVER HEARTS TABLE DECORATION        1 12/06/11 13:51  0.83
## 215975 556489      EMBOSSED GLASS TEALIGHT HOLDER        1 12/06/11 13:59  1.25
## 215979 556489         FRENCH LAVENDER SCENT HEART        3 12/06/11 13:59  0.75
## 215985 556489   MINIATURE ANTIQUE ROSE HOOK IVORY        3 12/06/11 13:59  0.83
## 215988 556489         SMALL WHITE HEART OF WICKER        2 12/06/11 13:59  1.69
## 216021 556491   SET OF 3 WOODEN HEART DECORATIONS        3 12/06/11 14:15  1.25
## 216030 556491               HEART OF WICKER LARGE        3 12/06/11 14:15  2.95
## 216031 556491         LARGE WHITE HEART OF WICKER        3 12/06/11 14:15  2.95
## 216594 556520  CERAMIC CAKE STAND + HANGING CAKES        1 13/06/11 11:10  9.95
## 217169 556596                   SET/4 BADGES DOGS       10 13/06/11 14:29  1.25
## 217965 556733   TRAVEL CARD WALLET VINTAGE TICKET       10 14/06/11 11:53  0.42
## 218104 556776       BISCUIT TIN VINTAGE CHRISTMAS        2 14/06/11 12:24  2.89
## 219143 556813              REGENCY TEA PLATE PINK       10 14/06/11 17:28  1.65
## 219632 556879          VINTAGE UNION JACK BUNTING        1 15/06/11 12:07  8.50
## 219646 556882  WOOD 2 DRAWER CABINET WHITE FINISH        2 15/06/11 12:21  6.95
## 219840 556905          ZINC HERB GARDEN CONTAINER        1 15/06/11 13:05  6.25
## 219885 556905                   GUMBALL COAT RACK        1 15/06/11 13:05  2.55
## 219887 556905       LUNCH BAG VINTAGE LEAF DESIGN        1 15/06/11 13:05  1.65
## 219889 556905           LUNCH BAG ALPHABET DESIGN        1 15/06/11 13:05  1.65
## 219890 556905             LUNCH BAG  BLACK SKULL.        1 15/06/11 13:05  1.65
## 219894 556905                 LUNCH BAG CARS BLUE        1 15/06/11 13:05  1.65
## 219897 556905             LUNCH BAG  BLACK SKULL.        1 15/06/11 13:05  1.65
## 219943 556910        SMALL HEART MEASURING SPOONS        1 15/06/11 13:25  0.85
## 219987 556910                     JUMBO BAG PEARS        1 15/06/11 13:25  2.08
## 220009 556910 CHRISTMAS STAR WISH LIST CHALKBOARD       12 15/06/11 13:25  1.25
## 220017 556910         BLACK PIRATE TREASURE CHEST        2 15/06/11 13:25  1.65
## 220019 556910        BROWN  PIRATE TREASURE CHEST        2 15/06/11 13:25  1.65
## 220022 556910       CUBIC MUG FLOCK PINK ON BROWN        6 15/06/11 13:25  0.39
## 220030 556910           12 PENCILS TALL TUBE POSY       24 15/06/11 13:25  0.29
## 220031 556910       CUBIC MUG FLOCK PINK ON BROWN        6 15/06/11 13:25  0.39
## 220069 556912             LUNCH BAG RED RETROSPOT        1 15/06/11 13:26  1.65
## 220140 556915          ZINC HERB GARDEN CONTAINER        2 15/06/11 13:35  6.25
## 220145 556915     12 MESSAGE CARDS WITH ENVELOPES        1 15/06/11 13:35  1.65
## 220150 556915      SET OF PICTURE FRAME  STICKERS        1 15/06/11 13:35  2.95
## 220155 556915              LUNCH BAG APPLE DESIGN        1 15/06/11 13:35  1.65
## 220160 556915          ZINC HERB GARDEN CONTAINER        2 15/06/11 13:35  6.25
## 220172 556915                GIRAFFE WOODEN RULER        1 15/06/11 13:35  1.95
## 220234 556916  12 PENCILS TALL TUBE RED RETROSPOT        2 15/06/11 13:35  0.85
## 220448 556926  MINI WOODEN HAPPY BIRTHDAY GARLAND        1 15/06/11 14:26  1.69
## 220452 556926       WOODEN HAPPY BIRTHDAY GARLAND        1 15/06/11 14:26  2.95
## 220453 556926          FELTCRAFT BUTTERFLY HEARTS        1 15/06/11 14:26  1.45
## 220454 556926   PARTY CONES CANDY TREE DECORATION        6 15/06/11 14:26  0.85
## 221232 557019         CHICK GREY HOT WATER BOTTLE        1 16/06/11 12:45  3.45
## 221235 557019                 PHOTO FRAME CORNICE        1 16/06/11 12:45  2.95
## 221238 557019         BIRD HOUSE HOT WATER BOTTLE        1 16/06/11 12:45  2.55
## 221239 557019  SMALL PARISIENNE HEART PHOTO FRAME        1 16/06/11 12:45  2.49
## 221242 557019       SET/3 DECOUPAGE STACKING TINS        1 16/06/11 12:45  4.95
## 221243 557019    GARDENERS KNEELING PAD KEEP CALM        1 16/06/11 12:45  1.65
## 221244 557019          BISCUIT TIN 50'S CHRISTMAS        2 16/06/11 12:45  2.89
## 221533 557063      VINTAGE KITCHEN PRINT PUDDINGS        6 16/06/11 15:01  2.55
## 221534 557063      VINTAGE KITCHEN PRINT PUDDINGS        6 16/06/11 15:01  2.55
## 222273 557129       FRENCH BLUE METAL DOOR SIGN 1        1 16/06/11 19:59  1.25
## 222606 557213   SET OF 3 WOODEN HEART DECORATIONS        1 17/06/11 12:16  1.25
## 222617 557213   SET OF 3 WOODEN HEART DECORATIONS        1 17/06/11 12:16  1.25
## 222625 557213   STRAWBERRY LUNCH BOX WITH CUTLERY        1 17/06/11 12:16  2.55
## 223080 557250                HERB MARKER ROSEMARY        1 17/06/11 15:59  0.65
## 223394 557271        REX CASH+CARRY JUMBO SHOPPER        1 19/06/11 11:41  0.95
## 223411 557271        REX CASH+CARRY JUMBO SHOPPER        1 19/06/11 11:41  0.95
## 223434 557271        REX CASH+CARRY JUMBO SHOPPER        1 19/06/11 11:41  0.95
## 223604 557279         VINTAGE RED ENAMEL TRIM JUG        2 19/06/11 12:10  3.75
## 223669 557283      SET OF 9 HEART SHAPED BALLOONS        1 19/06/11 12:26  1.25
## 223670 557283                 LUNCH BAG CARS BLUE        1 19/06/11 12:26  1.65
## 223689 557283              LUNCH BAG APPLE DESIGN        1 19/06/11 12:26  1.65
## 224002 557305 CERAMIC HEART FAIRY CAKE MONEY BANK        4 19/06/11 14:42  1.45
## 224694 557389               REGENCY MILK JUG PINK        4 20/06/11 11:03  3.25
## 224736 557397        TRAVEL CARD WALLET TRANSPORT        1 20/06/11 11:23  0.42
## 224742 557397   TRAVEL CARD WALLET VINTAGE TICKET        1 20/06/11 11:23  0.42
## 224948 557442                DOLLY GIRL LUNCH BOX        1 20/06/11 12:53  1.95
## 224953 557442       CHILDS BREAKFAST SET SPACEBOY        1 20/06/11 12:53  9.95
## 226428 557595            RED METAL BOX TOP SECRET        2 21/06/11 11:19  8.25
## 227052 557636  SET/10 PINK POLKADOT PARTY CANDLES        2 21/06/11 15:41  1.25
## 227071 557636                  GREEN ROSE WASHBAG        1 21/06/11 15:41  3.75
## 227372 557644             SPACEBOY CHILDRENS BOWL        7 21/06/11 17:06  1.25
## 228044 557758        MODERN FLORAL STATIONERY SET        1 22/06/11 13:28  1.25
## 228051 557758      STRAWBERRY CERAMIC TRINKET BOX        4 22/06/11 13:28  1.25
## 228052 557758      SWEETHEART CERAMIC TRINKET BOX        4 22/06/11 13:28  1.25
## 228426 557787     SET 12 KIDS  WHITE CHALK STICKS        1 22/06/11 16:16  0.42
## 228546 557793                  RED RETROSPOT BOWL       12 22/06/11 17:30  1.25
## 228682 557799        BUNDLE OF 3 RETRO NOTE BOOKS       12  23/06/11 9:53  1.65
## 228795 557846          ICE CREAM SUNDAE LIP GLOSS       24 23/06/11 10:44  1.25
## 228914 557854      STRAWBERRY CERAMIC TRINKET BOX        4 23/06/11 11:38  1.25
## 228996 557858       RETRO LEAVES MAGNETIC NOTEPAD        1 23/06/11 11:51  1.45
## 229361 557886                      JUMBO BAG OWLS        1 23/06/11 13:39  2.08
## 229376 557886            REGENCY CAKESTAND 3 TIER        1 23/06/11 13:39 12.75
## 229513 557892 BUNDLE OF 3 ALPHABET EXERCISE BOOKS        1 23/06/11 14:11  1.65
## 229530 557892  SET OF 60 PANTRY DESIGN CAKE CASES        1 23/06/11 14:11  0.55
## 230259 557956   SET OF 60 VINTAGE LEAF CAKE CASES        1 23/06/11 19:20  0.55
## 230261 557956  SET OF 60 PANTRY DESIGN CAKE CASES        1 23/06/11 19:20  0.55
## 230262 557956      PACK OF 60 SPACEBOY CAKE CASES        1 23/06/11 19:20  0.55
## 230263 557956         PACK OF 72 SKULL CAKE CASES        1 23/06/11 19:20  0.55
## 230284 557956                 TEA TIME OVEN GLOVE        1 23/06/11 19:20  1.25
## 230291 557956              WOODLAND CHARLOTTE BAG        1 23/06/11 19:20  0.85
## 230293 557956           CHARLOTTE BAG SUKI DESIGN        1 23/06/11 19:20  0.85
## 230295 557956            STRAWBERRY CHARLOTTE BAG        1 23/06/11 19:20  0.85
## 230297 557956              WOODLAND CHARLOTTE BAG        1 23/06/11 19:20  0.85
## 230312 557956           JUMBO BAG SPACEBOY DESIGN        1 23/06/11 19:20  2.08
## 230327 557956                JUMBO BAG STRAWBERRY        1 23/06/11 19:20  2.08
## 230427 557960        SINGLE WIRE HOOK IVORY HEART        2 23/06/11 19:46  1.45
## 230877 558049        COLOURING PENCILS BROWN TUBE        1 24/06/11 14:16  0.42
## 230888 558049                  KIDS RAIN MAC BLUE        1 24/06/11 14:16  0.85
## 230893 558049              JAM MAKING SET PRINTED        1 24/06/11 14:16  1.45
## 231021 558063      FOLK ART GREETING CARD,pack/12        1 24/06/11 15:28  2.95
## 231504 558086      YOU'RE CONFUSING ME METAL SIGN        1 26/06/11 11:58  1.69
## 231669 558096         FOOD COVER WITH BEADS SET 2        2 26/06/11 13:24  3.75
## 231680 558096      VINTAGE PAISLEY STATIONERY SET        1 26/06/11 13:24  1.25
## 231795 558099     PACK OF 12 PINK PAISLEY TISSUES       12 26/06/11 13:45  0.29
## 231829 558100         CREAM SWEETHEART MINI CHEST        2 26/06/11 13:46 12.75
## 231873 558102   JUNGLE POPSICLES ICE LOLLY MOULDS        1 26/06/11 14:06  1.25
## 231946 558105         BOX OF 24 COCKTAIL PARASOLS        1 26/06/11 14:54  0.42
## 231953 558105 SET OF 4 PISTACHIO LOVEBIRD COASTER        1 26/06/11 14:54  0.79
## 231955 558105                CHOCOLATE CALCULATOR        1 26/06/11 14:54  1.65
## 231957 558105            PLASTERS IN TIN SPACEBOY        1 26/06/11 14:54  1.65
## 232026 558105                CHOCOLATE CALCULATOR        1 26/06/11 14:54  1.65
## 232035 558105       LUNCH BAG VINTAGE LEAF DESIGN        2 26/06/11 14:54  1.65
## 232720 558200           LUNCH BAG ALPHABET DESIGN        1 27/06/11 13:00  1.65
## 232721 558200             LUNCH BAG PINK POLKADOT        1 27/06/11 13:00  1.65
## 232802 558232      SET OF 4 ENGLISH ROSE COASTERS        1 27/06/11 14:30  1.25
## 232810 558232            STRAWBERRY CHARLOTTE BAG        2 27/06/11 14:30  0.85
## 232818 558232              TEA TIME PARTY BUNTING        1 27/06/11 14:30  4.95
## 232825 558232   BALLOON ART MAKE YOUR OWN FLOWERS        1 27/06/11 14:30  1.95
## 232838 558232               RED RETROSPOT WASHBAG        1 27/06/11 14:30  2.10
## 232867 558232  ROUND SNACK BOXES SET OF4 WOODLAND        1 27/06/11 14:30  2.95
## 233128 558240      METAL SIGN,CUPCAKE SINGLE HOOK        1 27/06/11 15:27  2.46
## 233167 558247        STRAWBERRY RAFFIA FOOD COVER        1 27/06/11 16:46  3.75
## 233173 558247   ROSE SCENT CANDLE JEWELLED DRAWER        2 27/06/11 16:46  4.25
## 233590 558330   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 28/06/11 12:16  3.75
## 233600 558330  SMALL DOLLY MIX DESIGN ORANGE BOWL        8 28/06/11 12:16  0.42
## 233601 558330  SMALL DOLLY MIX DESIGN ORANGE BOWL        8 28/06/11 12:16  0.42
## 233716 558340                 MINT KITCHEN SCALES        1 28/06/11 14:01  0.00
## 233719 558340           ENAMEL WATERING CAN CREAM        1 28/06/11 14:01  0.00
## 233798 558355                 MINT KITCHEN SCALES        1 28/06/11 14:58  8.50
## 233822 558355                  MAN FLU METAL SIGN        1 28/06/11 14:58  2.10
## 233833 558355        PSYCHEDELIC WALL THERMOMETER        1 28/06/11 14:58  2.55
## 233836 558355                RECIPE BOX RETROSPOT        1 28/06/11 14:58  2.95
## 233995 558370              FEATHER PEN,COAL BLACK       12 28/06/11 15:44  0.39
## 234007 558370           TRAVEL CARD WALLET SKULLS       24 28/06/11 15:44  0.42
## 234009 558370       TRAVEL CARD WALLET UNION JACK       24 28/06/11 15:44  0.42
## 234011 558370    TRAVEL CARD WALLET I LOVE LONDON       24 28/06/11 15:44  0.42
## 234585 558459           CHARLOTTE BAG SUKI DESIGN        1 29/06/11 14:20  0.85
## 235585 558532                 WHITE METAL LANTERN        1 30/06/11 11:32  3.75
## 235675 558535      RECYCLED ACAPULCO MAT LAVENDER        2 30/06/11 12:04  8.25
## 235716 558535                   TRAVEL SEWING KIT        4 30/06/11 12:04  1.65
## 235753 558538  MINI CAKE STAND WITH HANGING CAKES        1 30/06/11 12:12  1.45
## 236006 558558     BLUE STRIPE CERAMIC DRAWER KNOB        1 30/06/11 13:17  1.25
## 236729 558620 GARDENIA 3 WICK MORRIS BOXED CANDLE        1 30/06/11 16:39  4.25
## 237461 558700      SKULLS PARTY BAG + STICKER SET        1 01/07/11 12:33  1.65
## 237475 558700                 RED RETROSPOT PLATE        1 01/07/11 12:33  1.69
## 237480 558700              PLASTERS IN TIN SKULLS        1 01/07/11 12:33  1.65
## 237485 558700                 RED RETROSPOT PLATE        1 01/07/11 12:33  1.69
## 237500 558700      SKULLS  WATER TRANSFER TATTOOS        3 01/07/11 12:33  0.85
## 237514 558702      SINGLE ANTIQUE ROSE HOOK IVORY        2 01/07/11 12:45  1.45
## 237528 558702     PLASTERS IN TIN VINTAGE PAISLEY        1 01/07/11 12:45  1.65
## 237624 558707      MAGIC DRAWING SLATE DOLLY GIRL        1 01/07/11 12:58  0.42
## 237633 558707     12 MESSAGE CARDS WITH ENVELOPES        2 01/07/11 12:58  1.65
## 237717 558709     GLASS APOTHECARY BOTTLE PERFUME        1 01/07/11 13:02  3.95
## 237727 558709       NEW BAROQUE BLACK PHOTO ALBUM        2 01/07/11 13:02  2.95
## 237737 558709     PICNIC BOXES SET OF 3 RETROSPOT        1 01/07/11 13:02  4.95
## 237741 558709  ROUND SNACK BOXES SET OF4 WOODLAND        1 01/07/11 13:02  2.95
## 237742 558709   ROUND SNACK BOXES SET OF 4 FRUITS        1 01/07/11 13:02  2.95
## 237748 558710 WHITE TALL PORCELAIN T-LIGHT HOLDER        1 01/07/11 13:04  2.55
## 237749 558710             36 FOIL STAR CAKE CASES        1 01/07/11 13:04  2.10
## 238022 558751   SET 20 NAPKINS FAIRY CAKES DESIGN        1 03/07/11 11:26  0.85
## 238023 558751   SET 20 NAPKINS FAIRY CAKES DESIGN        1 03/07/11 11:26  0.85
## 238027 558751     SET/20 STRAWBERRY PAPER NAPKINS        3 03/07/11 11:26  0.85
## 238028 558751  SET/20 RED RETROSPOT PAPER NAPKINS        1 03/07/11 11:26  0.85
## 238039 558751             BLUE PAISLEY SKETCHBOOK        1 03/07/11 11:26  3.75
## 238051 558751 CERAMIC BOWL WITH STRAWBERRY DESIGN        2 03/07/11 11:26  2.95
## 238054 558751 CERAMIC BOWL WITH STRAWBERRY DESIGN        1 03/07/11 11:26  2.95
## 238056 558751  MINI CAKE STAND WITH HANGING CAKES        2 03/07/11 11:26  1.45
## 238116 558754               FELTCRAFT CUSHION OWL        1 03/07/11 12:10  3.75
## 238117 558754            FELTCRAFT CUSHION RABBIT        1 03/07/11 12:10  3.75
## 238180 558757                  OYSTER TRINKET BOX        1 03/07/11 12:22  3.25
## 238184 558757             VINTAGE BEAD PINK PURSE        2 03/07/11 12:22  0.83
## 238276 558761                DOLLY GIRL LUNCH BOX        1 03/07/11 12:52  1.95
## 238277 558761                  SPACEBOY LUNCH BOX        1 03/07/11 12:52  1.95
## 238278 558761             CIRCUS PARADE LUNCH BOX        1 03/07/11 12:52  1.95
## 238394 558767        REX CASH+CARRY JUMBO SHOPPER        1 03/07/11 13:27  0.95
## 238397 558768            LOVE BUILDING BLOCK WORD        1 03/07/11 13:33  5.95
## 238399 558768         ANTIQUE GLASS PEDESTAL BOWL        1 03/07/11 13:33  3.75
## 238410 558768             ENAMEL FLOWER JUG CREAM        1 03/07/11 13:33  5.95
## 238411 558768             FRENCH ENAMEL POT W LID        1 03/07/11 13:33  2.95
## 238441 558769        SET OF 4 PANTRY JELLY MOULDS        1 03/07/11 14:58  1.25
## 239509 558860       CHRISTMAS GARLAND STARS,TREES        1 04/07/11 12:18  3.75
## 239514 558860             MINI FUNKY DESIGN TAPES        1 04/07/11 12:18  0.85
## 239686 558863     LARGE ANTIQUE WHITE PHOTO FRAME        2 04/07/11 12:28  7.90
## 239877 558876         LUNCH BAG DOLLY GIRL DESIGN        1 04/07/11 13:36  1.65
## 239878 558876             LUNCH BAG PINK POLKADOT        1 04/07/11 13:36  1.65
## 239884 558876   ROUND SNACK BOXES SET OF 4 SKULLS        4 04/07/11 13:36  2.95
## 239904 558877              LUNCH BAG APPLE DESIGN        1 04/07/11 13:50  1.65
## 240136 558888            CHILDRENS DOLLY GIRL MUG        1 04/07/11 15:29  1.65
## 240160 558888          ALARM CLOCK BAKELIKE IVORY        1 04/07/11 15:29  3.75
## 240594 558906     IF YOU CAN'T STAND THE HEAT MUG        1 04/07/11 16:35  1.25
## 240917 558991              6 RIBBONS RUSTIC CHARM        1 05/07/11 11:32  1.65
## 240918 558991               CHOCOLATE BOX RIBBONS        1 05/07/11 11:32  1.25
## 240928 558991    PACK OF 20 NAPKINS PANTRY DESIGN        1 05/07/11 11:32  0.85
## 243030 559068            LUNCH BAG DOILEY PATTERN        1 06/07/11 10:41  1.65
## 243031 559068             LUNCH BAG  BLACK SKULL.        1 06/07/11 10:41  1.65
## 243037 559068         SMALL WHITE HEART OF WICKER        1 06/07/11 10:41  1.65
## 243048 559068       HEART DECORATION PAINTED ZINC        1 06/07/11 10:41  0.65
## 243054 559068       SET OF 5 MINI GROCERY MAGNETS        1 06/07/11 10:41  2.08
## 243162 559106        REX CASH+CARRY JUMBO SHOPPER        1 06/07/11 11:10  0.95
## 243221 559109                      LED TEA LIGHTS        1 06/07/11 11:52  2.89
## 243233 559109            JUMBO BAG 50'S CHRISTMAS        1 06/07/11 11:52  2.08
## 243247 559109    VINTAGE CREAM DOG FOOD CONTAINER        1 06/07/11 11:52  8.50
## 243380 559123                     JUMBO BAG PEARS        1 06/07/11 12:26  2.08
## 243549 559133        SET OF 5 PANCAKE DAY MAGNETS        1 06/07/11 13:13  2.08
## 245018 559297            SET OF 4 JAM JAR MAGNETS       12 07/07/11 12:36  2.08
## 245158 559307                  JUMBO BAG ALPHABET        4 07/07/11 13:02  2.08
## 246868 559424                HEN HOUSE DECORATION       12 08/07/11 12:14  1.65
## 248011 559520         PINK CRYSTAL+GLASS BRACELET        1 08/07/11 16:26  4.95
## 248129 559525     PACK OF 72 RETROSPOT CAKE CASES        3 10/07/11 10:30  0.55
## 248137 559525  SMALL DOLLY MIX DESIGN ORANGE BOWL        8 10/07/11 10:30  0.42
## 248139 559525        SMALL MARSHMALLOWS PINK BOWL        8 10/07/11 10:30  0.42
## 248405 559538                DOORMAT ENGLISH ROSE        1 10/07/11 12:25  7.95
## 248418 559538      METAL SIGN,CUPCAKE SINGLE HOOK        2 10/07/11 12:25  1.25
## 248512 559542        HEART DECORATION WITH PEARLS        1 10/07/11 13:32  0.85
## 248571 559544       SET OF 9 BLACK SKULL BALLOONS        1 10/07/11 13:52  0.85
## 248711 559548                FLOWERS TILE COASTER       24 10/07/11 15:17  0.29
## 248755 559549  SET OF 60 PANTRY DESIGN CAKE CASES        1 10/07/11 15:25  0.55
## 248794 559549   STRAWBERRY LUNCH BOX WITH CUTLERY        1 10/07/11 15:25  2.55
## 248867 559552                FELTCRAFT DOLL EMILY        1 10/07/11 16:29  2.95
## 248883 559552       SKULL AND CROSSBONES  GARLAND        1 10/07/11 16:29  1.65
## 248914 559552           LUNCH BAG SPACEBOY DESIGN        1 10/07/11 16:29  1.65
## 249055 559629     CHILDRENS CUTLERY POLKADOT BLUE        1 11/07/11 11:58  4.15
## 249129 559641          HEART FILIGREE DOVE  SMALL       24 11/07/11 12:31  1.25
## 249184 559653            SMALL HEART FLOWERS HOOK        1 11/07/11 12:49  0.85
## 249333 559665     WHITE JEWELLED HEART DECORATION        1 11/07/11 13:35  0.85
## 249339 559665              PLASTERS IN TIN SKULLS        2 11/07/11 13:35  1.65
## 249444 559672  MINI CAKE STAND WITH HANGING CAKES        1 11/07/11 14:04  1.45
## 249559 559674         GIN + TONIC DIET METAL SIGN       12 11/07/11 14:16  2.55
## 250237 559693                 EGG FRYING PAN BLUE        2 11/07/11 16:21  2.08
## 250962 559807      SET OF 4 ENGLISH ROSE COASTERS        1 12/07/11 14:48  1.25
## 251004 559807   4 PINK DINNER CANDLE SILVER FLOCK        1 12/07/11 14:48  2.55
## 251011 559807       SET OF 4 FAIRY CAKE PLACEMATS        2 12/07/11 14:48  3.75
## 251047 559809     STRIPEY CHOCOLATE NESTING BOXES        2 12/07/11 14:57  2.95
## 251558 559816       SET OF 4 FAIRY CAKE PLACEMATS        1 12/07/11 16:11  3.29
## 251628 559817      METAL SIGN,CUPCAKE SINGLE HOOK        1 12/07/11 16:20  2.46
## 252232 559876       12 PENCIL SMALL TUBE WOODLAND        1 13/07/11 11:09  0.65
## 252243 559876               HEART OF WICKER SMALL        1 13/07/11 11:09  1.65
## 252267 559876              WOODLAND CHARLOTTE BAG        1 13/07/11 11:09  0.85
## 252443 559887   MAGNETS PACK OF 4 HOME SWEET HOME        1 13/07/11 11:44  0.39
## 252451 559887               LA PALMIERA TILE HOOK        1 13/07/11 11:44  0.39
## 252560 559894         CHARLOTTE BAG PINK POLKADOT        1 13/07/11 12:06  0.85
## 252612 559894     FLOWER PURPLE CLOCK WITH SUCKER        1 13/07/11 12:06  0.29
## 252613 559894       FLOWER BLUE CLOCK WITH SUCKER        1 13/07/11 12:06  0.29
## 252622 559894  SMALL DOLLY MIX DESIGN ORANGE BOWL        8 13/07/11 12:06  0.42
## 252623 559894  SMALL DOLLY MIX DESIGN ORANGE BOWL        8 13/07/11 12:06  0.42
## 252661 559894  RED CHARLIE+LOLA PERSONAL DOORSIGN        2 13/07/11 12:06  0.39
## 252789 559902              6 RIBBONS RUSTIC CHARM        1 13/07/11 13:14  1.65
## 252792 559902     WHITE JEWELLED HEART DECORATION        1 13/07/11 13:14  0.85
## 253138 559921            JAZZ HEARTS ADDRESS BOOK        1 13/07/11 15:42  0.19
## 253145 559921                PIGGY BANK RETROSPOT        1 13/07/11 15:42  2.55
## 253154 559921              PLASTERS IN TIN SKULLS        1 13/07/11 15:42  1.65
## 253199 559921           BLACK STITCHED WALL CLOCK        2 13/07/11 15:42  0.79
## 253912 559984           SCANDINAVIAN REDS RIBBONS        1 14/07/11 11:45  1.25
## 253925 559984   ROUND SNACK BOXES SET OF 4 FRUITS        1 14/07/11 11:45  2.95
## 254037 559993             PENS ASSORTED SPACEBALL       36 14/07/11 12:42  0.19
## 254081 560018      PACK OF 20 SKULL PAPER NAPKINS        1 14/07/11 12:52  0.85
## 254088 560018                LARGE SKULL WINDMILL        1 14/07/11 12:52  2.10
## 254098 560018         CITRONELLA CANDLE FLOWERPOT        1 14/07/11 12:52  2.10
## 254100 560018              PLASTERS IN TIN SKULLS        1 14/07/11 12:52  1.65
## 254107 560018    PAINTED LIGHTBULB RAINBOW DESIGN        1 14/07/11 12:52  0.42
## 254113 560018      PACK OF 12 TRADITIONAL CRAYONS        1 14/07/11 12:52  0.42
## 254116 560018           PAINT YOUR OWN CANVAS SET        1 14/07/11 12:52  1.65
## 254123 560018     CHILDRENS APRON SPACEBOY DESIGN        1 14/07/11 12:52  1.95
## 254129 560018   RETROSPOT PARTY BAG + STICKER SET        1 14/07/11 12:52  1.65
## 254213 560025             LUNCH BAG  BLACK SKULL.        1 14/07/11 13:00  1.65
## 254216 560025            LUNCH BAG DOILEY PATTERN        1 14/07/11 13:00  1.65
## 254238 560026     BLUE STRIPE CERAMIC DRAWER KNOB        2 14/07/11 13:11  1.25
## 254412 560047            LOVE BUILDING BLOCK WORD        1 14/07/11 15:01  5.95
## 254417 560047                BRIGHT BLUES RIBBONS        1 14/07/11 15:01  1.25
## 254419 560047              ROMANTIC PINKS RIBBONS        1 14/07/11 15:01  1.25
## 255008 560104     TRAVEL CARD WALLET VINTAGE LEAF        2 14/07/11 18:56  0.42
## 255025 560104         LARGE WHITE HEART OF WICKER        1 14/07/11 18:56  2.95
## 255480 560203          MONEY BOX FIRST ADE DESIGN        1 15/07/11 13:13  1.25
## 255566 560209            VINTAGE SNAKES & LADDERS        2 15/07/11 14:05  3.75
## 255581 560209             20 DOLLY PEGS RETROSPOT        1 15/07/11 14:05  1.45
## 255601 560209           PARLOUR CERAMIC WALL HOOK        2 15/07/11 14:05  4.15
## 255637 560209           PARLOUR CERAMIC WALL HOOK        2 15/07/11 14:05  4.15
## 255738 560212             PINK FLOWER FABRIC PONY        2 15/07/11 14:58  3.75
## 255774 560223          3 HOOK HANGER MAGIC GARDEN        1 15/07/11 15:32  1.95
## 255780 560223      METAL SIGN,CUPCAKE SINGLE HOOK        1 15/07/11 15:32  1.25
## 255791 560223                  PINK POLKADOT BOWL        1 15/07/11 15:32  1.25
## 255795 560223              LUNCH BAG APPLE DESIGN        2 15/07/11 15:32  1.65
## 256245 560228              NAMASTE SWAGAT INCENSE        6 15/07/11 17:29  0.30
## 256331 560233                 TEA TIME OVEN GLOVE        1 17/07/11 11:10  1.25
## 256335 560233 ENGLISH ROSE SCENTED HANGING FLOWER        1 17/07/11 11:10  0.75
## 256546 560244                      KEY FOB , SHED        3 17/07/11 12:14  0.65
## 256597 560245               HEART OF WICKER SMALL        1 17/07/11 12:15  1.65
## 256609 560245                      SPOTTY BUNTING        1 17/07/11 12:15  4.95
## 256622 560245             EMERGENCY FIRST AID TIN        1 17/07/11 12:15  1.25
## 256770 560251            STORAGE TIN VINTAGE LEAF        1 17/07/11 12:32  2.89
## 256773 560251            STORAGE TIN VINTAGE LEAF        1 17/07/11 12:32  2.89
## 256791 560251         LARGE WHITE HEART OF WICKER        2 17/07/11 12:32  2.95
## 257041 560260                 LUNCH BAG CARS BLUE        1 17/07/11 13:32  1.65
## 257206 560270        REX CASH+CARRY JUMBO SHOPPER        1 17/07/11 14:42  0.95
## 257240 560271                  KITCHEN METAL SIGN        1 17/07/11 14:51  0.55
## 257250 560271       36 PENCILS TUBE RED RETROSPOT        1 17/07/11 14:51  1.25
## 257264 560271     PINK FAIRY CAKE CHILDRENS APRON        1 17/07/11 14:51  1.95
## 257272 560271              WOODLAND CHARLOTTE BAG        1 17/07/11 14:51  0.85
## 257278 560271                  VINTAGE SNAP CARDS        1 17/07/11 14:51  0.85
## 257286 560271       ASSTD MULTICOLOUR CIRCLES MUG        1 17/07/11 14:51  0.39
## 257291 560271    PACK OF 12 HEARTS DESIGN TISSUES        1 17/07/11 14:51  0.29
## 257296 560271    CHERRY BLOSSOM  DECORATIVE FLASK        1 17/07/11 14:51  3.75
## 257300 560271       CHILDRENS APRON APPLES DESIGN        1 17/07/11 14:51  1.95
## 257311 560271             CHILDS GARDEN RAKE PINK        1 17/07/11 14:51  2.10
## 257320 560271         PACK OF 12 SPACEBOY TISSUES        1 17/07/11 14:51  0.29
## 257931 560305                 APRON APPLE DELIGHT        1 18/07/11 10:49  4.95
## 257938 560305           LUNCH BAG SPACEBOY DESIGN        1 18/07/11 10:49  1.65
## 258431 560385  WHITE HANGING HEART T-LIGHT HOLDER        1 18/07/11 12:53  2.95
## 258435 560385           SPOTTY PINK DUCK DOORSTOP        1 18/07/11 12:53  4.25
## 258531 560393         JIGSAW RABBIT AND BIRDHOUSE        1 18/07/11 13:33  0.59
## 259528 560444                BLUE POLKADOT BEAKER        6 18/07/11 17:15  0.39
## 260329 560555  WHITE HANGING HEART T-LIGHT HOLDER        1 19/07/11 13:01  2.95
## 260340 560555           12 PENCILS TALL TUBE POSY        2 19/07/11 13:01  0.29
## 260351 560555  WHITE HANGING HEART T-LIGHT HOLDER        1 19/07/11 13:01  2.95
## 260354 560555      NATURAL SLATE HEART CHALKBOARD        2 19/07/11 13:01  2.95
## 260357 560555        RETROSPOT SMALL TUBE MATCHES        1 19/07/11 13:01  1.65
## 260359 560555           BOUDOIR SQUARE TISSUE BOX        1 19/07/11 13:01  0.39
## 260364 560555     PINK VINTAGE PAISLEY PICNIC BAG        1 19/07/11 13:01  1.65
## 261145 560644                    JUMBO BAG APPLES       10 20/07/11 11:22  2.08
## 261174 560644   SET OF 3 WOODEN HEART DECORATIONS        1 20/07/11 11:22  1.25
## 261178 560644    PACK OF 20 NAPKINS PANTRY DESIGN        3 20/07/11 11:22  0.85
## 261257 560650 FRIDGE MAGNETS LES ENFANTS ASSORTED       12 20/07/11 11:38  0.85
## 261449 560692     RED RETROSPOT OVEN GLOVE DOUBLE        1 20/07/11 12:01  2.95
## 261452 560692           SWALLOW SQUARE TISSUE BOX        1 20/07/11 12:01  0.39
## 261453 560692        REX CASH+CARRY JUMBO SHOPPER        1 20/07/11 12:01  0.95
## 261589 560701    TRAVEL CARD WALLET I LOVE LONDON       24 20/07/11 12:45  0.42
## 261880 560723       ROCKING HORSE GREEN CHRISTMAS        5 20/07/11 13:53  0.85
## 261887 560723                 MINI JIGSAW BUNNIES        1 20/07/11 13:53  0.42
## 262011 560726              STAR DECORATION RUSTIC        1 20/07/11 14:16  0.42
## 262150 560732             LUNCH BAG  BLACK SKULL.        1 20/07/11 14:55  1.65
## 263245 560791      TOILET SIGN OCCUPIED OR VACANT       24 21/07/11 10:30  0.83
## 263340 560826      PINK REGENCY TEACUP AND SAUCER        6 21/07/11 11:30  2.95
## 263445 560833         LARGE WHITE HEART OF WICKER        1 21/07/11 12:14  2.95
## 263461 560833 GARDENIA 1 WICK MORRIS BOXED CANDLE        1 21/07/11 12:14  4.25
## 263462 560833   RED FLORAL FELTCRAFT SHOULDER BAG        1 21/07/11 12:14  3.75
## 263468 560833 SET OF TEA COFFEE SUGAR TINS PANTRY        2 21/07/11 12:14  4.95
## 263471 560833                IVORY KITCHEN SCALES        1 21/07/11 12:14  8.50
## 263625 560853 GREEN DRAWER KNOB ACRYLIC EDWARDIAN       12 21/07/11 12:33  1.25
## 263717 560861    GLITTER HEART GARLAND WITH BELLS        1 21/07/11 13:37  3.75
## 263720 560861              GLITTER CHRISTMAS TREE        3 21/07/11 13:37  0.85
## 263734 560861 GARDENIA 1 WICK MORRIS BOXED CANDLE        1 21/07/11 13:37  4.25
## 263741 560861                 HAPPY STENCIL CRAFT        1 21/07/11 13:37  1.25
## 263743 560861              MONSTERS STENCIL CRAFT        1 21/07/11 13:37  1.25
## 263744 560861         COSY HOUR CIGAR BOX MATCHES        1 21/07/11 13:37  1.25
## 263750 560861 SET 12 LAVENDER  BOTANICAL T-LIGHTS        1 21/07/11 13:37  2.95
## 263804 560863                          PHOTO CUBE        6 21/07/11 13:53  1.65
## 263807 560863                          PHOTO CUBE        6 21/07/11 13:53  1.65
## 263813 560863      SET OF 9 HEART SHAPED BALLOONS        3 21/07/11 13:53  1.25
## 265011 560937            SET OF 4 JAM JAR MAGNETS        1 22/07/11 10:52  2.08
## 265016 560937           SET/4 BIRD MIRROR MAGNETS        1 22/07/11 10:52  0.29
## 265026 560937             MINI JIGSAW BAKE A CAKE        1 22/07/11 10:52  0.42
## 265027 560937               MINI JIGSAW LEAP FROG        1 22/07/11 10:52  0.42
## 265028 560937                MINI JIGSAW SPACEBOY        1 22/07/11 10:52  0.42
## 265029 560937          MINI JIGSAW GO TO THE FAIR        1 22/07/11 10:52  0.42
## 265030 560937              MINI JIGSAW DOLLY GIRL        1 22/07/11 10:52  0.42
## 265031 560937                  MINI JIGSAW PURDEY        1 22/07/11 10:52  0.42
## 265873 561026            RED RETROSPOT TISSUE BOX        1 24/07/11 10:49  0.39
## 265882 561026          ZINC HERB GARDEN CONTAINER        1 24/07/11 10:49  6.25
## 266046 561034    PACK OF 12 CIRCUS PARADE TISSUES        2 24/07/11 11:45  0.29
## 266088 561036  SET OF 60 PANTRY DESIGN CAKE CASES        1 24/07/11 11:54  0.55
## 266101 561036    SET OF 4 KNICK KNACK TINS LONDON        2 24/07/11 11:54  4.15
## 266105 561036           TREASURE TIN BUFFALO BILL        1 24/07/11 11:54  2.08
## 266710 561079         ROCKING HORSE RED CHRISTMAS        1 24/07/11 16:12  0.85
## 267141 561099     CANDLEHOLDER PINK HANGING HEART        1 25/07/11 11:01  2.95
## 267309 561113          MINI LADLE LOVE HEART PINK        1 25/07/11 12:09  0.42
## 267314 561113                       CHILLI LIGHTS        1 25/07/11 12:09  5.75
## 267318 561113             NO JUNK MAIL METAL SIGN        1 25/07/11 12:09  0.39
## 267763 561197              36 PENCILS TUBE SKULLS        1 25/07/11 14:35  1.25
## 268173 561209      METAL SIGN,CUPCAKE SINGLE HOOK        1 25/07/11 16:57  2.46
## 269211 561321           DRAWER KNOB CERAMIC BLACK        6 26/07/11 12:59  1.45
## 269757 561369      METAL SIGN,CUPCAKE SINGLE HOOK        1 26/07/11 16:22  2.46
## 270313 561465              6 RIBBONS RUSTIC CHARM        1 27/07/11 12:45  1.65
## 270315 561465                  PANTRY APPLE CORER        1 27/07/11 12:45  1.45
## 270449 561485          SET/6 COLLAGE PAPER PLATES        6 27/07/11 13:42  0.39
## 270721 561512  3 PIECE SPACEBOY COOKIE CUTTER SET        1 27/07/11 15:09  2.10
## 271205 561520  SET OF 60 I LOVE LONDON CAKE CASES        3 27/07/11 17:03  0.55
## 271855 561626       ASSORTED COLOUR BIRD ORNAMENT        8 28/07/11 14:03  1.69
## 271880 561626         SMALL WHITE HEART OF WICKER        2 28/07/11 14:03  1.65
## 271887 561626               LUNCH BAG SUKI DESIGN        2 28/07/11 14:03  1.65
## 272428 561658  FAIRY CAKE FLANNEL ASSORTED COLOUR        1 28/07/11 16:06  2.55
## 272508 561661    HANGING METAL CHICKEN DECORATION        2 28/07/11 16:21  1.25
## 272541 561661         COSY HOUR CIGAR BOX MATCHES        1 28/07/11 16:21  1.25
## 272911 561704                    PARTY METAL SIGN        1 29/07/11 11:07  1.45
## 273738 561859        TRAVEL CARD WALLET KEEP CALM       48 29/07/11 17:19  0.42
## 273757 561860               CHOCOLATE BOX RIBBONS        1 29/07/11 17:28  1.25
## 273848 561868   BALLOON ART MAKE YOUR OWN FLOWERS        1 31/07/11 11:26  1.95
## 273849 561868            STRAWBERRY CHARLOTTE BAG        1 31/07/11 11:26  0.85
## 273853 561868                 LUNCH BAG CARS BLUE        2 31/07/11 11:26  1.65
## 273882 561868      OFFICE MUG WARMER BLACK+SILVER        1 31/07/11 11:26  2.95
## 273895 561868    POTTERING IN THE SHED METAL SIGN        1 31/07/11 11:26  2.08
## 273983 561873      GIRLS ALPHABET IRON ON PATCHES     1440 31/07/11 11:48  0.17
## 274445 561893             RECYCLING BAG RETROSPOT        1 31/07/11 14:39  2.10
## 274455 561893            LUNCH BAG DOILEY PATTERN        1 31/07/11 14:39  1.65
## 274462 561893                JUMBO BAG STRAWBERRY        1 31/07/11 14:39  2.08
## 274463 561893   JUMBO SHOPPER VINTAGE RED PAISLEY        1 31/07/11 14:39  2.08
## 274478 561893             BLUE PAISLEY TISSUE BOX        1 31/07/11 14:39  0.39
## 274715 561897  PINK DRAWER KNOB ACRYLIC EDWARDIAN       12 31/07/11 15:24  1.25
## 274829 561900       ROCKING HORSE GREEN CHRISTMAS        1 31/07/11 15:31  0.85
## 274830 561900         ROCKING HORSE RED CHRISTMAS        1 31/07/11 15:31  0.85
## 275101 561912                     TUMBLER BAROQUE        6 01/08/11 11:08  0.39
## 275143 561915   ANTIQUE SILVER TEA GLASS ENGRAVED        6 01/08/11 11:23  1.25
## 275494 561968   IVORY SWEETHEART WIRE LETTER RACK        2 01/08/11 13:29  3.75
## 275887 562031      FRENCH KITCHEN SIGN BLUE METAL        1 01/08/11 17:37  1.25
## 275895 562031      FRENCH KITCHEN SIGN BLUE METAL        1 01/08/11 17:37  1.25
## 276008 562031                  BROCADE RING PURSE       36 01/08/11 17:37  0.29
## 276710 562096              200 BENDY SKULL STRAWS        1 02/08/11 13:16  1.25
## 277044 562106             GLITTER BUTTERFLY CLIPS        1 02/08/11 15:19  2.55
## 277047 562106           ASSORTED COLOUR METAL CAT        1 02/08/11 15:19  1.25
## 278157 562204         12 PENCILS TALL TUBE SKULLS        1 03/08/11 12:54  0.85
## 278177 562204        GREEN ENAMEL+GLASS HAIR COMB        1 03/08/11 12:54  2.10
## 278183 562204               BOOM BOX SPEAKER BOYS        1 03/08/11 12:54  5.95
## 278325 562213   SET OF 4 KNICK KNACK TINS POPPIES        1 03/08/11 13:39  4.15
## 278326 562213    SET OF 4 KNICK KNACK TINS DOILEY        1 03/08/11 13:39  4.15
## 278343 562213   SET OF 12 FAIRY CAKE BAKING CASES        8 03/08/11 13:39  0.83
## 278379 562213               MINT DINER WALL CLOCK        1 03/08/11 13:39  8.50
## 278635 562258                CHOCOLATE CALCULATOR        1 03/08/11 15:28  1.65
## 278640 562258   GARDENERS KNEELING PAD CUP OF TEA        1 03/08/11 15:28  1.65
## 278650 562258                CHOCOLATE CALCULATOR        1 03/08/11 15:28  1.65
## 278665 562258         WOODEN SCHOOL COLOURING SET        1 03/08/11 15:28  1.65
## 278671 562258        COLOURING PENCILS BROWN TUBE        1 03/08/11 15:28  1.25
## 278674 562258                     PETIT TRAY CHIC        2 03/08/11 15:28  1.65
## 278675 562258    TRADITIONAL WOODEN SKIPPING ROPE        1 03/08/11 15:28  1.45
## 280425 562427        TRAVEL CARD WALLET KEEP CALM        1 04/08/11 17:19  0.42
## 280694 562449       FRENCH TOILET SIGN BLUE METAL        4 04/08/11 20:01  1.25
## 280771 562453  SET/6 TURQUOISE BUTTERFLY T-LIGHTS       12 05/08/11 10:31  2.10
## 280978 562468 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 05/08/11 11:52  1.25
## 281028 562517             LUNCH BAG RED RETROSPOT        1 05/08/11 12:27  1.65
## 281051 562517    PACK OF 20 NAPKINS PANTRY DESIGN        2 05/08/11 12:27  0.85
## 281086 562517           RED RETROSPOT SHOPPER BAG        1 05/08/11 12:27  1.25
## 281184 562526        DOORMAT HOME SWEET HOME BLUE        1 05/08/11 13:46  7.95
## 281385 562539            RETROSPOT LARGE MILK JUG        1 05/08/11 15:30  4.95
## 281447 562540             TOXIC AREA  DOOR HANGER        3 05/08/11 15:38  0.39
## 281454 562540        CHILDRENS CUTLERY DOLLY GIRL        1 05/08/11 15:38  4.15
## 281455 562540     CHILDRENS CUTLERY CIRCUS PARADE        1 05/08/11 15:38  4.15
## 281465 562540                TEA FOR ONE POLKADOT        1 05/08/11 15:38  4.25
## 281500 562540                GEORGIAN TRINKET BOX        1 05/08/11 15:38 12.50
## 281553 562542                   CARD GINGHAM ROSE       12 05/08/11 15:40  0.42
## 281598 562549        FELTCRAFT PRINCESS LOLA DOLL        1 05/08/11 16:10  3.75
## 281653 562551               CHOCOLATE BOX RIBBONS        1 05/08/11 16:19  1.25
## 281683 562551   AMETHYST HOOP EARRING FLORAL LEAF        1 05/08/11 16:19  2.95
## 281894 562558        FRENCH STYLE STORAGE JAR JAM        6 05/08/11 16:43  0.29
## 281923 562558         60 TEATIME FAIRY CAKE CASES        3 05/08/11 16:43  0.55
## 281941 562558                 RED REFECTORY CLOCK        1 05/08/11 16:43  9.95
## 281987 562558               LUNCH BAG SUKI DESIGN        1 05/08/11 16:43  1.65
## 282126 562571  MINI CAKE STAND  HANGING STRAWBERY        1 07/08/11 12:21  1.65
## 282127 562571       CERAMIC STRAWBERRY DESIGN MUG        1 07/08/11 12:21  1.49
## 282202 562574                LANTERN CREAM GAZEBO        1 07/08/11 12:42  4.95
## 282205 562574                LANTERN CREAM GAZEBO        1 07/08/11 12:42  4.95
## 282336 562584         BLUE HAPPY BIRTHDAY BUNTING        2 07/08/11 14:16  5.45
## 282391 562587                REGENCY TEAPOT ROSES        1 07/08/11 14:34  9.95
## 282502 562593             PACK OF 12 SUKI TISSUES        4 07/08/11 15:43  0.29
## 282956 562619      PANTRY MAGNETIC  SHOPPING LIST        1 08/08/11 12:34  1.45
## 283063 562680         LUNCH BAG DOLLY GIRL DESIGN        1 08/08/11 13:46  1.65
## 283064 562680                  LUNCH BAG WOODLAND        1 08/08/11 13:46  1.65
## 283264 562688   GLASS STAR FROSTED T-LIGHT HOLDER        1 08/08/11 13:53  4.95
## 283292 562688               KEY FOB , FRONT  DOOR        7 08/08/11 13:53  0.65
## 283450 562711              MOODY GIRL DOOR HANGER        1 08/08/11 14:53  0.39
## 284172 562772      PAPERWEIGHT CHILDHOOD MEMORIES        2 09/08/11 12:07  2.55
## 284301 562779          FOUR HOOK  WHITE LOVEBIRDS        1 09/08/11 12:58  2.10
## 285248 562878       HEART DECORATION PAINTED ZINC        1 10/08/11 10:45  0.65
## 285680 562928   ANTIQUE SILVER TEA GLASS ENGRAVED        6 10/08/11 15:29  1.25
## 286331 562936              LUNCH BAG APPLE DESIGN        1 10/08/11 17:12  1.65
## 286347 562936  SMALL PARISIENNE HEART PHOTO FRAME        1 10/08/11 17:12  2.49
## 287340 563021        COFFEE MUG DOG + BALL DESIGN        6 11/08/11 13:25  2.55
## 287341 563021        COFFEE MUG CAT + BIRD DESIGN        6 11/08/11 13:25  2.55
## 287471 563026         LUNCH BAG DOLLY GIRL DESIGN        2 11/08/11 14:04  1.65
## 287477 563026                JUMBO BAG STRAWBERRY       10 11/08/11 14:04  2.08
## 287574 563033  BLUE DRAWER KNOB ACRYLIC EDWARDIAN        1 11/08/11 14:48  1.25
## 288214 563094    BEADED CHANDELIER T-LIGHT HOLDER        1 11/08/11 17:35  4.95
## 289302 563200       SET OF 6 HERB TINS SKETCHBOOK        1 14/08/11 10:49  3.95
## 289318 563200                      GARAGE KEY FOB        1 14/08/11 10:49  0.65
## 289369 563205                FELTCRAFT DOLL MOLLY        1 14/08/11 12:03  2.95
## 289451 563209            3 STRIPEY MICE FELTCRAFT        2 14/08/11 12:23  1.95
## 289592 563214              6 RIBBONS RUSTIC CHARM        1 14/08/11 12:56  1.65
## 289608 563214     PINK FAIRY CAKE CHILDRENS APRON        1 14/08/11 12:56  1.95
## 289638 563214  ROUND CONTAINER SET OF 5 RETROSPOT        1 14/08/11 12:56  1.65
## 289871 563239      CHARLOTTE BAG VINTAGE ALPHABET        1 15/08/11 10:02  0.85
## 290274 563328    PACK OF 12 HEARTS DESIGN TISSUES        2 15/08/11 13:07  0.29
## 290384 563349       SET OF 4 NAPKIN CHARMS LEAVES        1 15/08/11 13:51  2.55
## 290576 563354  SET OF 60 PANTRY DESIGN CAKE CASES        1 15/08/11 14:35  0.55
## 290584 563354           SWALLOW SQUARE TISSUE BOX        1 15/08/11 14:35  0.39
## 290587 563354                 WASHROOM METAL SIGN        1 15/08/11 14:35  1.45
## 290597 563354   GARDENERS KNEELING PAD CUP OF TEA        1 15/08/11 14:35  1.65
## 290832 563376             LUNCH BAG RED RETROSPOT        1 16/08/11 10:36  1.65
## 290844 563376    PACK OF 12 HEARTS DESIGN TISSUES       12 16/08/11 10:36  0.29
## 291568 563451       SET OF 4 FAIRY CAKE PLACEMATS        4 16/08/11 14:34  3.75
## 292129 563543                   TOOL BOX SOFT TOY        1 17/08/11 12:06  8.95
## 292468 563555        AIRLINE BAG VINTAGE TOKYO 78        1 17/08/11 13:21  4.25
## 292525 563555         ALARM CLOCK BAKELIKE ORANGE        1 17/08/11 13:21  3.75
## 292527 563555            ALARM CLOCK BAKELIKE RED        1 17/08/11 13:21  3.75
## 292529 563555          ALARM CLOCK BAKELIKE IVORY        1 17/08/11 13:21  3.75
## 292538 563555      PAPER CHAIN KIT 50'S CHRISTMAS        2 17/08/11 13:21  2.95
## 292654 563557      PACK OF 60 MUSHROOM CAKE CASES       24 17/08/11 13:33  0.55
## 293033 563572              GARDEN PATH SKETCHBOOK        1 17/08/11 15:00  3.75
## 293239 563585          SET OF 3 REGENCY CAKE TINS        1 17/08/11 17:01  4.95
## 293240 563585 SET/5 RED RETROSPOT LID GLASS BOWLS        1 17/08/11 17:01  2.95
## 293267 563589                 DOORMAT NEW ENGLAND       20 17/08/11 19:40  8.00
## 293327 563613      METAL SIGN,CUPCAKE SINGLE HOOK        8  18/08/11 8:49  1.25
## 293596 563617       BIRD DECORATION RED RETROSPOT       24  18/08/11 9:45  0.85
## 294607 563731               KEY FOB , FRONT  DOOR        5 18/08/11 17:44  0.65
## 294677 563734     SET OF 12  VINTAGE POSTCARD SET        1 18/08/11 18:11  0.65
## 294716 563737            HOME BUILDING BLOCK WORD        1 18/08/11 18:51  5.95
## 294746 563738     VICTORIAN GLASS HANGING T-LIGHT        6 18/08/11 19:13  1.25
## 294768 563739        TRAVEL CARD WALLET KEEP CALM       24 18/08/11 20:05  0.42
## 295236 563832       ASSORTED COLOUR BIRD ORNAMENT        8 19/08/11 12:33  1.69
## 295664 563908              PARISIENNE KEY CABINET        2 21/08/11 12:21  5.75
## 295740 563909        HANGING WOOD AND FELT FLOWER        5 21/08/11 12:36  0.12
## 295783 563909  PACK OF 60 PINK PAISLEY CAKE CASES        1 21/08/11 12:36  0.55
## 295785 563909                DOLLY GIRL LUNCH BOX        1 21/08/11 12:36  1.95
## 295885 563915 RIDGED BONNE JAM JAR T-LIGHT HOLDER        6 21/08/11 13:24  1.65
## 295886 563915 RIDGED BONNE JAM JAR T-LIGHT HOLDER        6 21/08/11 13:24  1.65
## 295893 563915            RIDGED GLASS FINGER BOWL        6 21/08/11 13:24  0.39
## 295896 563915                   REGENCY TEA SPOON       12 21/08/11 13:24  1.25
## 295927 563917        3D DOG PICTURE PLAYING CARDS        1 21/08/11 13:46  2.95
## 295943 563917          VINTAGE UNION JACK BUNTING        1 21/08/11 13:46  8.50
## 295952 563917        LARGE HEART MEASURING SPOONS        1 21/08/11 13:46  1.65
## 295967 563917                IVORY KITCHEN SCALES        1 21/08/11 13:46  8.50
## 295999 563920 CLEAR DRAWER KNOB ACRYLIC EDWARDIAN       12 21/08/11 14:00  1.25
## 296001 563920      RED STRIPE CERAMIC DRAWER KNOB        6 21/08/11 14:00  1.25
## 296005 563920      DRAWER KNOB CRACKLE GLAZE PINK       12 21/08/11 14:00  1.65
## 296083 563924        NUMBER TILE COTTAGE GARDEN 2        1 21/08/11 14:32  1.95
## 296108 563924 WHITE TALL PORCELAIN T-LIGHT HOLDER        1 21/08/11 14:32  2.55
## 296115 563924    SET OF 12 T-LIGHTS VINTAGE DOILY        3 21/08/11 14:32  1.95
## 296118 563924        NUMBER TILE COTTAGE GARDEN 0        1 21/08/11 14:32  1.95
## 296157 563924                    PARTY METAL SIGN        1 21/08/11 14:32  1.45
## 296169 563924  WOOD 2 DRAWER CABINET WHITE FINISH        1 21/08/11 14:32  6.95
## 296182 563924 WHITE TALL PORCELAIN T-LIGHT HOLDER        1 21/08/11 14:32  2.55
## 296189 563924         GREY HEART HOT WATER BOTTLE        3 21/08/11 14:32  3.75
## 296226 563925      PANTRY MAGNETIC  SHOPPING LIST        1 21/08/11 14:42  1.45
## 296486 563933  12 PENCILS TALL TUBE RED RETROSPOT        1 21/08/11 15:54  0.85
## 296516 563935           PARLOUR CERAMIC WALL HOOK        1 21/08/11 16:24  4.15
## 297200 564049  SET OF 60 I LOVE LONDON CAKE CASES        1 22/08/11 13:30  0.55
## 297201 564049                 MOTORING TISSUE BOX        1 22/08/11 13:30  0.39
## 297202 564049        COLOURING PENCILS BROWN TUBE       10 22/08/11 13:30  0.42
## 297345 564052       MAGNETS PACK OF 4 RETRO PHOTO        2 22/08/11 13:40  0.39
## 298114 564139   METAL DECORATION NAUGHTY CHILDREN        1 23/08/11 11:41  0.85
## 298620 564172    TRADITIONAL WOODEN SKIPPING ROPE        1 23/08/11 14:19  1.45
## 299087 564199           STORAGE TIN VINTAGE DOILY        1 23/08/11 17:31  2.89
## 299680 564300            REGENCY CAKESTAND 3 TIER        1 24/08/11 11:31 12.75
## 299780 564303              PLASTERS IN TIN SKULLS       12 24/08/11 12:04  1.65
## 300150 564327             JUMBO BAG RED RETROSPOT      100 24/08/11 13:33  1.74
## 300251 564335    PACK OF 12 RED RETROSPOT TISSUES        1 24/08/11 14:23  0.29
## 300308 564335        REX CASH+CARRY JUMBO SHOPPER        2 24/08/11 14:23  0.95
## 300379 564342            36 FOIL HEART CAKE CASES        1 24/08/11 14:53  2.10
## 300382 564342     FOOD CONTAINER SET 3 LOVE HEART        1 24/08/11 14:53  1.95
## 300384 564342          BISCUIT TIN 50'S CHRISTMAS        1 24/08/11 14:53  2.89
## 300387 564342       GINGERBREAD MAN COOKIE CUTTER        1 24/08/11 14:53  1.25
## 300388 564342              PARTY CHARMS 50 PIECES        1 24/08/11 14:53  0.83
## 300389 564342           COCKTAIL SWORDS 50 PIECES        1 24/08/11 14:53  0.83
## 300426 564342   MAGNETS PACK OF 4 HOME SWEET HOME        1 24/08/11 14:53  0.39
## 300430 564342   MAGNETS PACK OF 4 VINTAGE COLLAGE        1 24/08/11 14:53  0.39
## 300431 564342   FOLDING BUTTERFLY MIRROR HOT PINK        1 24/08/11 14:53  0.83
## 300469 564342     PACK OF 72 RETROSPOT CAKE CASES        1 24/08/11 14:53  0.55
## 300492 564342         60 TEATIME FAIRY CAKE CASES        2 24/08/11 14:53  0.55
## 300499 564342     60 CAKE CASES VINTAGE CHRISTMAS        3 24/08/11 14:53  0.55
## 300769 564356   BLUE SCOTTIE DOG W FLOWER PATTERN        1 24/08/11 15:47  2.55
## 300808 564356        TREASURE TIN GYMKHANA DESIGN        6 24/08/11 15:47  2.08
## 300810 564356   ROUND SNACK BOXES SET OF 4 FRUITS        1 24/08/11 15:47  2.95
## 300822 564356      JUMBO  BAG BAROQUE BLACK WHITE        2 24/08/11 15:47  2.08
## 301816 564526   BALLOON ART MAKE YOUR OWN FLOWERS       10 25/08/11 14:50  1.95
## 301986 564536              IVORY DINER WALL CLOCK        1 25/08/11 15:12  8.50
## 302033 564539                 WALL TIDY RETROSPOT        5 25/08/11 15:22  2.10
## 302153 564553   ANTIQUE SILVER TEA GLASS ENGRAVED        6 25/08/11 18:45  1.25
## 302167 564553             ENAMEL FLOWER JUG CREAM        1 25/08/11 18:45  5.95
## 302220 564556          SET OF 5 LUCKY CAT MAGNETS        1 25/08/11 19:48  2.08
## 302786 564647        MEASURING TAPE BABUSHKA BLUE        1 26/08/11 13:56  2.95
## 302960 564660     60 CAKE CASES DOLLY GIRL DESIGN       24 26/08/11 14:45  0.55
## 303128 564715           HEART IVORY TRELLIS SMALL        1 28/08/11 11:01  1.25
## 303129 564715           HEART IVORY TRELLIS LARGE        1 28/08/11 11:01  1.65
## 303130 564715           HEART IVORY TRELLIS LARGE        1 28/08/11 11:01  1.65
## 303131 564715           HEART IVORY TRELLIS SMALL        1 28/08/11 11:01  1.25
## 303137 564715          VICTORIAN SEWING BOX SMALL        1 28/08/11 11:01  5.95
## 303214 564719     60 CAKE CASES DOLLY GIRL DESIGN        1 28/08/11 11:55  0.55
## 303353 564725              6 RIBBONS RUSTIC CHARM        1 28/08/11 12:28  1.65
## 303379 564725  SET OF 6 RIBBONS VINTAGE CHRISTMAS        1 28/08/11 12:28  2.89
## 303418 564725                  JUMBO BAG ALPHABET        1 28/08/11 12:28  2.08
## 303437 564726            WRAP VINTAGE LEAF DESIGN       25 28/08/11 12:29  0.42
## 303457 564727              ALPHABET STENCIL CRAFT        1 28/08/11 12:31  1.25
## 303462 564727            RETROSPOT LARGE MILK JUG        1 28/08/11 12:31  4.95
## 303480 564727        TREASURE TIN GYMKHANA DESIGN        1 28/08/11 12:31  2.08
## 303481 564727            PLASTERS IN TIN SPACEBOY        1 28/08/11 12:31  1.65
## 303492 564727           DAIRY MAID LARGE MILK JUG        1 28/08/11 12:31  4.95
## 303509 564727      SMALL PURPLE BABUSHKA NOTEBOOK        1 28/08/11 12:31  0.85
## 303511 564727     PLASTERS IN TIN VINTAGE PAISLEY        1 28/08/11 12:31  1.65
## 303521 564727   SET OF 3 BUTTERFLY COOKIE CUTTERS        1 28/08/11 12:31  1.25
## 303522 564727             LUNCH BOX I LOVE LONDON        1 28/08/11 12:31  1.95
## 303526 564727      PACK 6 HEART/ICE-CREAM PATCHES        1 28/08/11 12:31  1.25
## 303542 564727                  SPACEBOY LUNCH BOX        1 28/08/11 12:31  1.95
## 303543 564727                DOLLY GIRL LUNCH BOX        1 28/08/11 12:31  1.95
## 303544 564727   ROUND SNACK BOXES SET OF 4 FRUITS        1 28/08/11 12:31  2.95
## 303557 564727           WOODEN OWLS LIGHT GARLAND        1 28/08/11 12:31  4.25
## 303640 564729            WOOD STAMP SET THANK YOU        2 28/08/11 12:44  0.83
## 303729 564733       HEART DECORATION PAINTED ZINC        1 28/08/11 13:18  0.65
## 303818 564734          COLUMBIAN CANDLE RECTANGLE        1 28/08/11 13:32  1.95
## 303893 564734               TEA TIME DES TEA COSY        1 28/08/11 13:32  2.55
## 303984 564739           TRAVEL CARD WALLET PANTRY        6 28/08/11 14:28  0.42
## 303995 564739                RED DINER WALL CLOCK        1 28/08/11 14:28  8.50
## 303996 564739              IVORY DINER WALL CLOCK        1 28/08/11 14:28  8.50
## 304042 564740        SINGLE WIRE HOOK IVORY HEART        1 28/08/11 14:39  1.45
## 304095 564742           IVORY WICKER HEART MEDIUM        1 28/08/11 15:01  1.25
## 304106 564742      DECORATIVE WICKER HEART MEDIUM        1 28/08/11 15:01  1.25
## 304160 564745    3 HOOK PHOTO SHELF ANTIQUE WHITE        1 28/08/11 15:27  8.50
## 304164 564745         NUMBER TILE VINTAGE FONT No        2 28/08/11 15:27  2.10
## 304172 564745          NUMBER TILE VINTAGE FONT 1        2 28/08/11 15:27  1.95
## 304178 564745   RECIPE BOX BLUE SKETCHBOOK DESIGN        1 28/08/11 15:27  2.95
## 304182 564745       LARGE CERAMIC TOP STORAGE JAR        1 28/08/11 15:27  1.65
## 304191 564745           CARAVAN SQUARE TISSUE BOX        1 28/08/11 15:27  0.39
## 304226 564747       ENGLISH ROSE HOT WATER BOTTLE        1 28/08/11 16:09  4.25
## 307320 564843    VICTORIAN  METAL POSTCARD SPRING        1 30/08/11 14:09  1.69
## 307339 564843            DOLLY GIRL BABY GIFT SET        1 30/08/11 14:09 16.95
## 307385 564848      DRAWER KNOB CRACKLE GLAZE BLUE        6 30/08/11 15:37  1.65
## 308095 564962        METAL MERRY CHRISTMAS WREATH        1 31/08/11 14:35  1.95
## 308096 564962       PENCIL CASE LIFE IS BEAUTIFUL        1 31/08/11 14:35  2.95
## 308543 564995               HEART OF WICKER LARGE        1 31/08/11 16:09  2.95
## 308659 565067    LUNCH BOX WITH CUTLERY RETROSPOT        1 31/08/11 17:16  2.55
## 308660 565067        SKULL LUNCH BOX WITH CUTLERY        1 31/08/11 17:16  2.55
## 309201 565141                  LUNCH BAG WOODLAND        1 01/09/11 13:40  1.65
## 309204 565141                  LUNCH BAG WOODLAND        1 01/09/11 13:40  1.65
## 309205 565141             LUNCH BAG RED RETROSPOT        1 01/09/11 13:40  1.65
## 309231 565141      PACK OF 60 MUSHROOM CAKE CASES        1 01/09/11 13:40  0.55
## 309241 565141                  PANTRY ROLLING PIN        1 01/09/11 13:40  3.75
## 309498 565151             PANTRY WASHING UP BRUSH        1 01/09/11 14:29  1.45
## 309576 565152            WOOD STAMP SET THANK YOU        1 01/09/11 14:42  0.83
## 309669 565198      METAL SIGN,CUPCAKE SINGLE HOOK        2 01/09/11 16:18  1.25
## 311343 565303        SKULL LUNCH BOX WITH CUTLERY        1 02/09/11 12:17  2.55
## 311510 565324   PAPER CHAIN KIT VINTAGE CHRISTMAS        1 02/09/11 13:18  2.95
## 311511 565324      PAPER CHAIN KIT 50'S CHRISTMAS        1 02/09/11 13:18  2.95
## 311512 565324    VINTAGE CREAM CAT FOOD CONTAINER        1 02/09/11 13:18  6.35
## 311634 565329           EDWARDIAN PARASOL NATURAL        1 02/09/11 13:54  5.95
## 311668 565331     ROSES REGENCY TEACUP AND SAUCER        1 02/09/11 13:59  2.95
## 311669 565331 SET OF 10 LANTERNS FAIRY LIGHT STAR        1 02/09/11 13:59  4.15
## 312006 565388          FRENCH ENAMEL CANDLEHOLDER        1 02/09/11 15:56  2.10
## 312296 565398            SET OF 4 JAM JAR MAGNETS       12 02/09/11 16:50  2.08
## 312300 565398       TRAVEL CARD WALLET UNION JACK       24 02/09/11 16:50  0.42
## 312329 565401     RED RETROSPOT OVEN GLOVE DOUBLE        1 02/09/11 17:38  2.95
## 312331 565401      SET 2 TEA TOWELS I LOVE LONDON        1 02/09/11 17:38  3.25
## 312338 565401         ALARM CLOCK BAKELIKE ORANGE        1 02/09/11 17:38  3.75
## 312340 565401     GLASS JAR ENGLISH CONFECTIONERY        1 02/09/11 17:38  2.95
## 312385 565406               36 DOILIES DOLLY GIRL       12 04/09/11 10:59  1.45
## 312430 565407           FELTCRAFT GIRL AMELIE KIT        1 04/09/11 11:00  4.95
## 312454 565408     SCANDINAVIAN PAISLEY PICNIC BAG        1 04/09/11 11:12  1.65
## 312455 565408   JUMBO SHOPPER VINTAGE RED PAISLEY        1 04/09/11 11:12  2.08
## 312461 565408         GREY HEART HOT WATER BOTTLE        1 04/09/11 11:12  4.25
## 312532 565411 SET OF 2 TEA TOWELS APPLE AND PEARS        1 04/09/11 11:22  3.25
## 312711 565420        METAL MERRY CHRISTMAS WREATH        2 04/09/11 12:09  1.95
## 312745 565421  SET OF 72 RETROSPOT PAPER  DOILIES        1 04/09/11 12:10  1.45
## 312746 565421  SET OF 72 PINK HEART PAPER DOILIES        1 04/09/11 12:10  1.45
## 312753 565421     PACK OF 72 RETROSPOT CAKE CASES        1 04/09/11 12:10  0.55
## 312828 565426            ASSORTED CIRCULAR MOBILE        1 04/09/11 12:41  0.21
## 312829 565426            ASSORTED CIRCULAR MOBILE        1 04/09/11 12:41  0.21
## 312830 565426     RECIPE BOX PANTRY YELLOW DESIGN        1 04/09/11 12:41  2.95
## 312909 565430   AIRLINE BAG VINTAGE JET SET BROWN        1 04/09/11 13:07  4.25
## 312924 565430      ALARM CLOCK BAKELIKE CHOCOLATE        2 04/09/11 13:07  3.75
## 312940 565431    POTTERING IN THE SHED METAL SIGN        1 04/09/11 13:15  2.08
## 312949 565431      TOILET SIGN OCCUPIED OR VACANT        1 04/09/11 13:15  0.83
## 313044 565432       PRETTY HANGING QUILTED HEARTS        1 04/09/11 13:16  0.83
## 313045 565432       PRETTY HANGING QUILTED HEARTS        1 04/09/11 13:16  0.83
## 313162 565434       HANGING MINI COLOURED BOTTLES        1 04/09/11 13:35  0.63
## 313433 565445    STAR WOODEN CHRISTMAS DECORATION        5 04/09/11 14:50  0.85
## 313626 565455          ENAMEL MEASURING JUG CREAM        1 04/09/11 16:09  4.25
## 313663 565456          TOAST ITS - HAPPY BIRTHDAY        1 04/09/11 16:12  1.25
## 313678 565456          RETRO COFFEE MUGS ASSORTED        1 04/09/11 16:12  1.65
## 313679 565456                      GLAMOROUS  MUG        1 04/09/11 16:12  1.25
## 313685 565456         FELTCRAFT BOY JEAN-PAUL KIT        1 04/09/11 16:12  4.95
## 314001 565478                HOT BATHS METAL SIGN        1 05/09/11 11:18  2.10
## 314232 565541                   EMPIRE TISSUE BOX        2 05/09/11 12:00  0.39
## 314267 565541           SWALLOW SQUARE TISSUE BOX        1 05/09/11 12:00  0.39
## 314284 565541       HOME SWEET HOME HANGING HEART        2 05/09/11 12:00  0.85
## 314309 565541      MAGIC DRAWING SLATE DOLLY GIRL        1 05/09/11 12:00  0.42
## 315042 565648    WHITE ROCKING HORSE HAND PAINTED        1 05/09/11 16:22  1.25
## 315052 565648         T-LIGHT HOLDER HANGING LACE        1 05/09/11 16:22  1.25
## 315111 565649             CIRCUS PARADE LUNCH BOX        2 05/09/11 16:27  1.95
## 315173 565664           PAPER CHAIN KIT RETROSPOT       40 05/09/11 17:36  2.55
## 315400 565682           STORAGE TIN VINTAGE DOILY        1 06/09/11 10:42  2.89
## 315489 565726        FLUTED ANTIQUE CANDLE HOLDER       12 06/09/11 11:58  0.85
## 315675 565734                 WASHROOM METAL SIGN        1 06/09/11 12:15  1.45
## 315959 565766      PACK OF 60 MUSHROOM CAKE CASES        1 06/09/11 14:23  0.55
## 315981 565766          FOUR HOOK  WHITE LOVEBIRDS        1 06/09/11 14:23  2.10
## 316024 565766    SET OF 3 CAKE TINS PANTRY DESIGN        1 06/09/11 14:23  4.95
## 316027 565766               PEG BAG APPLES DESIGN        1 06/09/11 14:23  2.55
## 316038 565766        TREASURE TIN GYMKHANA DESIGN        2 06/09/11 14:23  2.08
## 318756 566013              HAND WARMER OWL DESIGN       48 08/09/11 12:16  2.10
## 318856 566018                  BLUE POLKADOT BOWL        1 08/09/11 12:42  1.25
## 318857 566018                 GREEN POLKADOT BOWL        1 08/09/11 12:42  1.25
## 318858 566018                  PINK POLKADOT BOWL        1 08/09/11 12:42  1.25
## 318859 566018                  RED RETROSPOT BOWL        1 08/09/11 12:42  1.25
## 318863 566018              PINK HORSE SOCK PUPPET        1 08/09/11 12:42  2.95
## 318889 566018           STORAGE TIN VINTAGE DOILY        2 08/09/11 12:42  2.89
## 318940 566019           HOT WATER BOTTLE SEX BOMB        2 08/09/11 12:44  4.95
## 318943 566019      RED WOOLLY HOTTIE WHITE HEART.        2 08/09/11 12:44  4.25
## 319100 566033    ASSORTED COLOUR SUCTION CUP HOOK        1 08/09/11 13:07  0.19
## 319125 566033      PACK OF 20 SKULL PAPER NAPKINS        1 08/09/11 13:07  0.85
## 319442 566055               LOVE HOT WATER BOTTLE        1 08/09/11 15:05  5.95
## 319990 566085        TRAVEL CARD WALLET RETROSPOT        1 09/09/11 10:12  0.42
## 319994 566085             LUNCH BAG RED RETROSPOT        1 09/09/11 10:12  1.65
## 320056 566091                   RED PAPER PARASOL        1 09/09/11 10:37  2.95
## 320110 566094                FEATHER PEN,HOT PINK       12 09/09/11 10:42  0.39
## 320128 566094             20 DOLLY PEGS RETROSPOT        6 09/09/11 10:42  1.45
## 320424 566171    LUNCH BOX WITH CUTLERY RETROSPOT        1 09/09/11 12:22  2.55
## 320540 566189              PINK HORSE SOCK PUPPET        4 09/09/11 13:19  2.95
## 320557 566190  ASS FLORAL PRINT MULTI SCREWDRIVER       12 09/09/11 13:20  0.42
## 320682 566194                HOT BATHS METAL SIGN        1 09/09/11 13:42  2.10
## 320928 566203   ANTIQUE SILVER TEA GLASS ENGRAVED        6 09/09/11 14:47  1.25
## 320941 566203               LOVE HOT WATER BOTTLE        2 09/09/11 14:47  5.95
## 321258 566221      METAL SIGN,CUPCAKE SINGLE HOOK        2 09/09/11 16:13  2.46
## 321370 566225         60 TEATIME FAIRY CAKE CASES        1 11/09/11 10:35  0.55
## 321581 566238      BELLE JARDINIERE CUSHION COVER        1 11/09/11 11:24  3.75
## 321583 566238       HOME SWEET HOME CUSHION COVER        1 11/09/11 11:24  3.75
## 321584 566238   LA JARDIN BOTANIQUE CUSHION COVER        1 11/09/11 11:24  3.75
## 321596 566238                DOLLY GIRL LUNCH BOX        1 11/09/11 11:24  1.95
## 321597 566238    RED HANGING HEART T-LIGHT HOLDER        1 11/09/11 11:24  2.95
## 321726 566249   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 11/09/11 12:09  3.75
## 321729 566249           FELTCRAFT CHRISTMAS FAIRY        1 11/09/11 12:09  4.25
## 321736 566249         CHRISTMAS CRAFT WHITE FAIRY        1 11/09/11 12:09  1.45
## 321767 566251    ASSORTED MONKEY SUCTION CUP HOOK       10 11/09/11 12:13  0.42
## 321818 566258   MARIE ANTOINETTE TRINKET BOX GOLD        1 11/09/11 12:45 12.50
## 321824 566258    RETROSPOT HEART HOT WATER BOTTLE        1 11/09/11 12:45  4.95
## 321830 566258     HOT WATER BOTTLE I AM SO POORLY        1 11/09/11 12:45  4.95
## 321831 566258     HOT WATER BOTTLE I AM SO POORLY        1 11/09/11 12:45  4.95
## 321833 566258   MARIE ANTOINETTE TRINKET BOX GOLD        1 11/09/11 12:45 12.50
## 321835 566258   MARIE ANTOINETTE TRINKET BOX GOLD        1 11/09/11 12:45 12.50
## 322004 566266       LAVENDER SCENTED FABRIC HEART        5 11/09/11 13:22  1.25
## 322005 566266       LAVENDER SCENTED FABRIC HEART        5 11/09/11 13:22  1.25
## 322057 566269  3 TRADITIONAl BISCUIT CUTTERS  SET        1 11/09/11 13:39  2.10
## 322073 566269      PACK OF 60 DINOSAUR CAKE CASES        1 11/09/11 13:39  0.55
## 322093 566269              SPACEBOY MINI BACKPACK        1 11/09/11 13:39  4.15
## 322097 566269      PACK OF 60 DINOSAUR CAKE CASES        1 11/09/11 13:39  0.55
## 322099 566269       VINTAGE CARAVAN GREETING CARD       12 11/09/11 13:39  0.42
## 322102 566269       SET OF 20 KIDS COOKIE CUTTERS        1 11/09/11 13:39  2.10
## 322103 566269       SET OF 20 KIDS COOKIE CUTTERS        1 11/09/11 13:39  2.10
## 322106 566269                  CARD I LOVE LONDON       12 11/09/11 13:39  0.42
## 322107 566269              PINK HORSE SOCK PUPPET        1 11/09/11 13:39  2.95
## 322108 566269          DINOSAUR KEYRINGS ASSORTED       36 11/09/11 13:39  0.21
## 322109 566269              PINK HORSE SOCK PUPPET        1 11/09/11 13:39  2.95
## 322115 566270      METAL SIGN,CUPCAKE SINGLE HOOK        8 11/09/11 13:40  1.25
## 322237 566272      PINK REGENCY TEACUP AND SAUCER        1 11/09/11 13:51  2.95
## 322241 566272   T-LIGHT HOLDER SWEETHEART HANGING        4 11/09/11 13:51  1.95
## 322242 566272          HANGING METAL STAR LANTERN        6 11/09/11 13:51  1.65
## 322243 566272    FOLKART ZINC HEART CHRISTMAS DEC       12 11/09/11 13:51  0.85
## 322336 566275  SET OF 60 I LOVE LONDON CAKE CASES        2 11/09/11 13:58  0.55
## 322453 566279 SILVER GLITTER FLOWER VOTIVE HOLDER        6 11/09/11 14:09  0.29
## 322472 566279      BLUE STONES ON WIRE FOR CANDLE       24 11/09/11 14:09  0.08
## 322473 566279      BLUE STONES ON WIRE FOR CANDLE       24 11/09/11 14:09  0.08
## 322609 566281          PEACE WOODEN BLOCK LETTERS        1 11/09/11 14:15  6.95
## 322619 566281               LOVE HOT WATER BOTTLE       12 11/09/11 14:15  5.95
## 322666 566283             36 FOIL STAR CAKE CASES        6 11/09/11 14:34  2.10
## 322705 566285   ANTIQUE SILVER TEA GLASS ENGRAVED        6 11/09/11 14:51  1.25
## 322707 566285       SILVER HANGING T-LIGHT HOLDER        6 11/09/11 14:51  1.65
## 322870 566290    POCKET BAG BLUE PAISLEY RED SPOT        1 11/09/11 15:24  1.25
## 322871 566290  POCKET BAG PINK PAISELY BROWN SPOT        1 11/09/11 15:24  1.25
## 322906 566290       ENGLISH ROSE HOT WATER BOTTLE        1 11/09/11 15:24  4.25
## 322912 566290 JUMBO BAG SCANDINAVIAN BLUE PAISLEY        1 11/09/11 15:24  2.08
## 322930 566290       LUNCH BAG VINTAGE LEAF DESIGN        1 11/09/11 15:24  1.65
## 322937 566290 JUMBO BAG SCANDINAVIAN BLUE PAISLEY        1 11/09/11 15:24  2.08
## 322955 566290   ROUND SNACK BOXES SET OF 4 SKULLS        1 11/09/11 15:24  2.95
## 322969 566290                    LIPSTICK PEN RED        1 11/09/11 15:24  0.42
## 322972 566290            36 PENCILS TUBE WOODLAND        1 11/09/11 15:24  1.25
## 322989 566290       PACK OF 20 NAPKINS RED APPLES        1 11/09/11 15:24  0.85
## 323077 566291             CHILDS GARDEN RAKE PINK        1 11/09/11 15:31  2.10
## 323202 566295  ASS FLORAL PRINT MULTI SCREWDRIVER       12 11/09/11 15:44  0.42
## 323283 566296         PACK OF 72 SKULL CAKE CASES        1 11/09/11 15:47  0.55
## 323297 566297              LOVE HEART TRINKET POT        2 11/09/11 15:50  0.39
## 323312 566297                      JUMBO BAG OWLS        1 11/09/11 15:50  2.08
## 323801 566345          GLASS HEART T-LIGHT HOLDER       12 12/09/11 12:27  0.85
## 323805 566345        T-LIGHT GLASS FLUTED ANTIQUE       12 12/09/11 12:27  1.25
## 323822 566345                    WRAP GREEN PEARS       25 12/09/11 12:27  0.42
## 323919 566397        PLEASE ONE PERSON METAL SIGN        2 12/09/11 12:54  2.10
## 324043 566400      PINK REGENCY TEACUP AND SAUCER        6 12/09/11 13:16  2.95
## 324132 566408      MAGIC DRAWING SLATE DOLLY GIRL        1 12/09/11 13:43  0.42
## 324141 566408                MINI JIGSAW SPACEBOY        1 12/09/11 13:43  0.42
## 324172 566408         PAPERWEIGHT VINTAGE COLLAGE        2 12/09/11 13:43  2.55
## 324187 566408                 GLASS JAR MARMALADE        1 12/09/11 13:43  2.95
## 324258 566420      PAPER CHAIN KIT 50'S CHRISTMAS        2 12/09/11 13:50  2.95
## 324505 566434        CHILDREN'S CIRCUS PARADE MUG        6 12/09/11 15:01  1.65
## 324506 566434          HOT WATER BOTTLE KEEP CALM       12 12/09/11 15:01  4.95
## 324847 566450               LONDON BUS COFFEE MUG        6 12/09/11 16:12  2.55
## 324848 566450    SET OF 4 KNICK KNACK TINS LONDON        6 12/09/11 16:12  4.15
## 324853 566450                    SOLDIERS EGG CUP       12 12/09/11 16:12  1.25
## 324857 566450            CHILDRENS DOLLY GIRL MUG        6 12/09/11 16:12  1.65
## 324932 566451    GLITTER HEART GARLAND WITH BELLS        1 12/09/11 16:14  3.75
## 324955 566451              MADRAS NOTEBOOK MEDIUM        2 12/09/11 16:14  0.75
## 325232 566489  WHITE SPOT RED CERAMIC DRAWER KNOB       12 13/09/11 10:17  1.45
## 325343 566495      SET/2 RED RETROSPOT TEA TOWELS        1 13/09/11 11:14  3.25
## 325397 566495                  KIDS RAIN MAC BLUE        3 13/09/11 11:14  0.85
## 325455 566518      DOORMAT SPOTTY HOME SWEET HOME        1 13/09/11 11:24  8.25
## 325991 566564         RED RETROSPOT CHARLOTTE BAG        1 13/09/11 12:26  0.85
## 326852 566601       DECORATIVE WICKER HEART LARGE        1 13/09/11 15:57  1.65
## 326860 566601      SMALL RED RETROSPOT MUG IN BOX        1 13/09/11 15:57  3.75
## 326874 566601         UNION JACK FLAG LUGGAGE TAG        1 13/09/11 15:57  1.25
## 327265 566604             RED VINTAGE SPOT BEAKER        8 13/09/11 16:26  0.85
## 327634 566647           HAND WARMER RED RETROSPOT        1 14/09/11 11:21  2.10
## 328099 566726      CHRISTMAS CRAFT LITTLE FRIENDS        1 14/09/11 13:12  2.10
## 328133 566726              HAND WARMER OWL DESIGN        1 14/09/11 13:12  2.10
## 328320 566735              KINGS CHOICE TEA CADDY        1 14/09/11 14:19  2.95
## 328331 566735            RETROSPOT LARGE MILK JUG        1 14/09/11 14:19  4.95
## 328919 566786        TREASURE TIN GYMKHANA DESIGN        6 15/09/11 10:29  2.08
## 328931 566786                       PARTY BUNTING        4 15/09/11 10:29  4.95
## 329450 566851    SET OF 12 MINI LOAF BAKING CASES        2 15/09/11 12:16  0.83
## 329453 566851          CHOCOLATE HOT WATER BOTTLE        1 15/09/11 12:16  4.95
## 329530 566864                LADS ONLY TISSUE BOX        1 15/09/11 12:51  0.39
## 329916 566913                     PETIT TRAY CHIC       12 15/09/11 14:07  1.65
## 330209 566932          VINTAGE COFFEE GRINDER BOX        1 15/09/11 15:29  4.95
## 330215 566932     RECIPE BOX PANTRY YELLOW DESIGN        1 15/09/11 15:29  2.95
## 332261 567153   SET OF 6 SPICE TINS PANTRY DESIGN        1 16/09/11 16:25  3.95
## 332466 567165   MINIATURE ANTIQUE ROSE HOOK IVORY        1 18/09/11 11:58  0.83
## 332468 567165                      JUMBO BAG OWLS        1 18/09/11 11:58  2.08
## 332586 567168 CERAMIC BOWL WITH STRAWBERRY DESIGN        1 18/09/11 12:24  2.95
## 332590 567168      SET 2 TEA TOWELS I LOVE LONDON        2 18/09/11 12:24  3.25
## 332612 567170        SET OF 4 PANTRY JELLY MOULDS        1 18/09/11 12:40  1.25
## 332628 567170  SET OF 3 WOODEN SLEIGH DECORATIONS        1 18/09/11 12:40  1.25
## 332639 567170    SET OF 4 KNICK KNACK TINS LONDON        1 18/09/11 12:40  4.15
## 332642 567170    SET OF 4 KNICK KNACK TINS LONDON        1 18/09/11 12:40  4.15
## 332697 567170   SET OF 12 FAIRY CAKE BAKING CASES        1 18/09/11 12:40  0.83
## 332700 567170             JUMBO BAG RED RETROSPOT        2 18/09/11 12:40  2.08
## 332701 567170              JUMBO BAG VINTAGE LEAF        1 18/09/11 12:40  2.08
## 332965 567182        FELTCRAFT PRINCESS LOLA DOLL        3 18/09/11 15:21  3.75
## 333019 567183                    EMPIRE GIFT WRAP       25 18/09/11 15:32  0.42
## 333107 567183           SWEETHEART WIRE WALL TIDY        1 18/09/11 15:32  9.95
## 333120 567183      DRAWER KNOB CRACKLE GLAZE PINK        6 18/09/11 15:32  1.65
## 333193 567183               MINT DINER WALL CLOCK        1 18/09/11 15:32  8.50
## 333198 567183          EMBOSSED HEART TRINKET BOX        4 18/09/11 15:32  2.08
## 333361 567183           DAIRY MAID LARGE MILK JUG        1 18/09/11 15:33  4.95
## 333373 567183        RED RETROSPOT SMALL MILK JUG        1 18/09/11 15:33  2.55
## 333533 567185          ROUND CAKE TIN VINTAGE RED        1 18/09/11 15:55  7.95
## 333541 567185              JUMBO STORAGE BAG SUKI        1 18/09/11 15:55  2.08
## 333930 567211  RED CHARLIE+LOLA PERSONAL DOORSIGN        2 19/09/11 11:02  0.39
## 334099 567288    FUNKY WASHING UP GLOVES ASSORTED        1 19/09/11 11:49  2.10
## 334108 567288                IVORY KITCHEN SCALES        1 19/09/11 11:49  8.50
## 334110 567288      PINK PAISLEY SQUARE TISSUE BOX        1 19/09/11 11:49  0.39
## 334119 567288          RAINY LADIES BIRTHDAY CARD       12 19/09/11 11:49  0.42
## 334128 567288        SET OF 4 PANTRY JELLY MOULDS        1 19/09/11 11:49  1.25
## 334130 567288        REX CASH+CARRY JUMBO SHOPPER        1 19/09/11 11:49  0.95
## 335247 567424               RIBBON REEL POLKADOTS        5 20/09/11 11:16  1.65
## 335538 567462           TREASURE TIN BUFFALO BILL        1 20/09/11 12:35  2.08
## 335563 567462  PACK OF 60 PINK PAISLEY CAKE CASES        2 20/09/11 12:35  0.55
## 335573 567462              ENAMEL WASH BOWL CREAM        1 20/09/11 12:35  3.75
## 335582 567462  PACK OF 60 PINK PAISLEY CAKE CASES        1 20/09/11 12:35  0.55
## 335583 567462         PACK OF 72 SKULL CAKE CASES        1 20/09/11 12:35  0.55
## 335584 567462  SET OF 60 I LOVE LONDON CAKE CASES        1 20/09/11 12:35  0.55
## 335596 567462           TREASURE TIN BUFFALO BILL        1 20/09/11 12:35  2.08
## 335642 567472  SET/20 RED RETROSPOT PAPER NAPKINS        2 20/09/11 12:47  0.85
## 335702 567473            WOOD STAMP SET THANK YOU        1 20/09/11 12:50  0.83
## 335767 567474     PACK OF 12 VINTAGE LEAF TISSUES       12 20/09/11 12:53  0.39
## 335818 567475     60 CAKE CASES VINTAGE CHRISTMAS        1 20/09/11 13:11  0.55
## 335833 567475          RIBBON REEL STRIPES DESIGN        1 20/09/11 13:11  1.65
## 335839 567475              WOODLAND MINI BACKPACK        1 20/09/11 13:11  4.15
## 335850 567475  SET OF 60 PANTRY DESIGN CAKE CASES        1 20/09/11 13:11  0.55
## 335855 567475  PACK OF 60 PINK PAISLEY CAKE CASES        1 20/09/11 13:11  0.55
## 335857 567475        PAINTED METAL PEARS ASSORTED        4 20/09/11 13:11  1.69
## 335859 567475    LUNCH BOX WITH CUTLERY RETROSPOT        1 20/09/11 13:11  2.55
## 335865 567475        MODERN FLORAL STATIONERY SET        1 20/09/11 13:11  1.25
## 335874 567475               FELTCRAFT CUSHION OWL        1 20/09/11 13:11  3.75
## 336028 567482           LUNCH BAG SPACEBOY DESIGN        1 20/09/11 13:42  1.65
## 336029 567482             LUNCH BAG RED RETROSPOT        1 20/09/11 13:42  1.65
## 336036 567482          PEACE WOODEN BLOCK LETTERS        1 20/09/11 13:42  6.95
## 337866 567661            SET OF 4 JAM JAR MAGNETS        1 21/09/11 15:06  2.08
## 337867 567661        SET OF 5 PANCAKE DAY MAGNETS        1 21/09/11 15:06  2.08
## 337935 567662   ASSORTED TUTTI FRUTTI LARGE PURSE        4 21/09/11 15:12  2.10
## 337936 567662   ASSORTED TUTTI FRUTTI LARGE PURSE        4 21/09/11 15:12  2.10
## 337938 567662   ASSORTED TUTTI FRUTTI SMALL PURSE        4 21/09/11 15:12  1.25
## 337939 567662   ASSORTED TUTTI FRUTTI SMALL PURSE        4 21/09/11 15:12  1.25
## 339810 567768   JUMBO SHOPPER VINTAGE RED PAISLEY       10 22/09/11 11:17  2.08
## 339845 567792        VINTAGE CHRISTMAS CAKE FRILL       12 22/09/11 11:40  1.65
## 340108 567805           DOORMAT RESPECTABLE HOUSE        1 22/09/11 12:15  8.25
## 340156 567807       EMBROIDERED RIBBON REEL EMILY        1 22/09/11 12:23  2.08
## 340187 567809          TRADITIONAL MODELLING CLAY       24 22/09/11 12:29  1.25
## 340311 567818  WOOD 2 DRAWER CABINET WHITE FINISH        2 22/09/11 12:41  6.95
## 340597 567853       BALLOON PUMP WITH 10 BALLOONS        2 22/09/11 13:31  1.95
## 340839 567866                 GLASS BONNE JAM JAR        1 22/09/11 14:13  4.15
## 341703 567909           SET OF 6 SOLDIER SKITTLES        4 22/09/11 16:53  3.75
## 342028 567935       LUNCH BAG VINTAGE LEAF DESIGN       10 22/09/11 18:07  1.65
## 342761 568049 SET OF 3 WOODEN STOCKING DECORATION        2 23/09/11 12:38  1.25
## 342809 568049 ASSORTED COLOUR LIZARD SUCTION HOOK        1 23/09/11 12:38  0.42
## 342858 568050     CHILDRENS CUTLERY POLKADOT PINK        1 23/09/11 12:38  4.15
## 343600 568066      COFFEE MUG BLUE PAISLEY DESIGN        6 23/09/11 13:48  2.55
## 343632 568066        REX CASH+CARRY JUMBO SHOPPER        1 23/09/11 13:48  0.95
## 343636 568066    SET OF 6 SNACK LOAF BAKING CASES        1 23/09/11 13:48  0.83
## 343637 568066     VINTAGE DOILY TRAVEL SEWING KIT        1 23/09/11 13:48  1.95
## 343642 568066         PLAYING CARDS I LOVE LONDON        1 23/09/11 13:48  1.25
## 344624 568141   PINK CREAM FELT CRAFT TRINKET BOX        1 25/09/11 11:21  1.25
## 344626 568141    PINK BLUE FELT CRAFT TRINKET BOX        1 25/09/11 11:21  1.25
## 344631 568141         FELTCRAFT CUSHION BUTTERFLY        1 25/09/11 11:21  3.75
## 344635 568141            3 STRIPEY MICE FELTCRAFT        1 25/09/11 11:21  1.95
## 344638 568141      CHRISTMAS CRAFT TREE TOP ANGEL        1 25/09/11 11:21  2.10
## 344647 568141                 DOORMAT BLACK FLOCK        1 25/09/11 11:21  8.25
## 344673 568142     GLASS APOTHECARY BOTTLE PERFUME        1 25/09/11 11:22  3.95
## 344962 568156          CHOCOLATE HOT WATER BOTTLE        1 25/09/11 12:16  4.95
## 345033 568161   SET OF 4 KNICK KNACK TINS POPPIES        1 25/09/11 12:31  4.15
## 345036 568161      SET OF 4 KNICK KNACK TINS LEAF        1 25/09/11 12:31  4.15
## 345037 568161      EMBROIDERED RIBBON REEL SOPHIE        1 25/09/11 12:31  3.75
## 345089 568163     STRIPEY CHOCOLATE NESTING BOXES        1 25/09/11 12:34  2.95
## 345104 568163          ZINC HERB GARDEN CONTAINER        2 25/09/11 12:34  6.25
## 345105 568163             GINGHAM RECIPE BOOK BOX        4 25/09/11 12:34  4.95
## 345112 568163 SET OF 20 VINTAGE CHRISTMAS NAPKINS        1 25/09/11 12:34  0.85
## 345121 568163      BELLE JARDINIERE CUSHION COVER        2 25/09/11 12:34  3.75
## 345335 568170          OFFICE MUG WARMER POLKADOT        1 25/09/11 13:08  2.95
## 345337 568170      OFFICE MUG WARMER BLACK+SILVER        1 25/09/11 13:08  2.95
## 345338 568170      OFFICE MUG WARMER BLACK+SILVER        1 25/09/11 13:08  2.95
## 345339 568170          OFFICE MUG WARMER POLKADOT        1 25/09/11 13:08  2.95
## 345348 568170      SET OF 6 3D KIT CARDS FOR KIDS        3 25/09/11 13:08  0.85
## 345360 568170              IVORY DINER WALL CLOCK        1 25/09/11 13:08  8.50
## 345425 568174          SET OF 3 REGENCY CAKE TINS        1 25/09/11 13:23  4.95
## 345426 568174    SET OF 3 CAKE TINS PANTRY DESIGN        1 25/09/11 13:23  4.95
## 345602 568183 WHITE SPOT BLUE CERAMIC DRAWER KNOB        2 25/09/11 13:47  1.45
## 345607 568183      ROUND PURPLE CLOCK WITH SUCKER        1 25/09/11 13:47  0.19
## 345672 568186    TRADITIONAL WOODEN SKIPPING ROPE        2 25/09/11 14:08  1.45
## 345681 568186           SPOTTY PINK DUCK DOORSTOP        1 25/09/11 14:08  4.25
## 345682 568186          DOORSTOP RACING CAR DESIGN        1 25/09/11 14:08  3.75
## 345683 568186            DOORSTOP RETROSPOT HEART        1 25/09/11 14:08  3.75
## 345742 568188      PACK OF 12 CHRISTMAS FUN CARDS        1 25/09/11 14:33  2.95
## 345780 568188           SWALLOW SQUARE TISSUE BOX        2 25/09/11 14:33  0.39
## 345789 568188                MINI JIGSAW SPACEBOY        1 25/09/11 14:33  0.42
## 345934 568191     PINK HEART SHAPE EGG FRYING PAN        2 25/09/11 14:37  1.65
## 345974 568193              LUNCH BAG APPLE DESIGN       10 25/09/11 14:37  1.65
## 346349 568207       50'S CHRISTMAS PAPER GIFT BAG       10 25/09/11 15:34  0.82
## 346429 568212   STAR T-LIGHT HOLDER WILLIE WINKIE        1 25/09/11 16:05  1.65
## 346453 568212      VINTAGE PAISLEY STATIONERY SET        1 25/09/11 16:05  1.25
## 346455 568212          GREEN HEART COMPACT MIRROR        1 25/09/11 16:05  1.25
## 346472 568212              GOLD MINI TAPE MEASURE        1 25/09/11 16:05  0.85
## 346473 568212     VINTAGE DOILY TRAVEL SEWING KIT        1 25/09/11 16:05  1.95
## 346474 568212          MAGNETS PACK OF 4 SWALLOWS        1 25/09/11 16:05  0.39
## 346475 568212           BLUE ROUND COMPACT MIRROR        1 25/09/11 16:05  1.25
## 346476 568212      VINTAGE PAISLEY STATIONERY SET        1 25/09/11 16:05  1.25
## 346480 568212          FLORAL FOLK STATIONERY SET        2 25/09/11 16:05  1.25
## 346487 568212               REVOLVER WOODEN RULER        1 25/09/11 16:05  1.95
## 346495 568212      VINTAGE PAISLEY STATIONERY SET        1 25/09/11 16:05  1.25
## 346504 568212  LONG SILVER NECKLACE PASTEL FLOWER        1 25/09/11 16:05 12.75
## 346505 568212     5 STRAND GLASS NECKLACE CRYSTAL        1 25/09/11 16:05  6.35
## 346507 568212     SILVER BRACELET W PASTEL FLOWER        1 25/09/11 16:05  7.50
## 346627 568224         PLAYING CARDS I LOVE LONDON        2 26/09/11 10:22  1.25
## 346662 568226            WRAP VINTAGE LEAF DESIGN       25 26/09/11 10:39  0.42
## 346672 568226        REX CASH+CARRY JUMBO SHOPPER        1 26/09/11 10:39  0.95
## 346698 568227      PACK OF 60 DINOSAUR CAKE CASES        1 26/09/11 10:57  0.55
## 346810 568231                     CARD DOLLY GIRL       24 26/09/11 11:19  0.42
## 346938 568245            GINGHAM HEART DECORATION       12 26/09/11 12:23  0.85
## 346974 568301    PINK BLUE FELT CRAFT TRINKET BOX        1 26/09/11 12:45  1.25
## 346979 568301    GARDENERS KNEELING PAD KEEP CALM        2 26/09/11 12:45  1.65
## 346984 568301      DOORMAT SPOTTY HOME SWEET HOME        1 26/09/11 12:45  8.25
## 346986 568301  WHITE HANGING HEART T-LIGHT HOLDER        4 26/09/11 12:45  2.95
## 347288 568325            RETROSPOT LARGE MILK JUG        1 26/09/11 13:57  4.95
## 348802 568513          HAND WARMER RED LOVE HEART       24 27/09/11 12:36  2.10
## 348937 568517                 MOTORING TISSUE BOX        1 27/09/11 12:52  0.39
## 349173 568531         FELTCRAFT CUSHION BUTTERFLY        1 27/09/11 13:49  3.75
## 349174 568531               FELTCRAFT CUSHION OWL        1 27/09/11 13:49  3.75
## 349175 568531            FELTCRAFT CUSHION RABBIT        1 27/09/11 13:49  3.75
## 350398 568657        36 DOILIES VINTAGE CHRISTMAS        1 28/09/11 12:22  1.45
## 350441 568657                LADS ONLY TISSUE BOX        1 28/09/11 12:22  0.39
## 350447 568657   GARDENERS KNEELING PAD CUP OF TEA        1 28/09/11 12:22  1.65
## 350542 568662               LUNCH BAG SUKI DESIGN        1 28/09/11 12:36  1.65
## 350709 568668              LOVE HEART TRINKET POT        2 28/09/11 13:00  0.39
## 351064 568690      RED STRIPE CERAMIC DRAWER KNOB        2 28/09/11 14:43  1.45
## 351395 568703         BLACK PIRATE TREASURE CHEST        2 28/09/11 15:21  1.65
## 351480 568709              STRAWBERRY BATH SPONGE        2 28/09/11 15:42  1.25
## 351495 568709           12 PENCILS TALL TUBE POSY        1 28/09/11 15:42  0.29
## 351519 568710      72 SWEETHEART FAIRY CAKE CASES        1 28/09/11 15:42  0.55
## 351533 568710   SET OF 6 HALLOWEEN GHOST T-LIGHTS        2 28/09/11 15:42  0.42
## 351535 568710            JUMBO BAG 50'S CHRISTMAS        1 28/09/11 15:42  2.08
## 351537 568710               HANGING HEART BONHEUR        1 28/09/11 15:42  0.85
## 351538 568710       HOME SWEET HOME HANGING HEART        1 28/09/11 15:42  0.85
## 351548 568710       HOME SWEET HOME HANGING HEART        1 28/09/11 15:42  0.85
## 351619 568712    SET 3 RETROSPOT TEA,COFFEE,SUGAR        1 28/09/11 15:50  4.95
## 351624 568712           MEMO BOARD COTTAGE DESIGN        1 28/09/11 15:50  4.95
## 351641 568712            HOME BUILDING BLOCK WORD        1 28/09/11 15:50  6.25
## 351644 568712   SET OF 3 WOODEN HEART DECORATIONS        1 28/09/11 15:50  1.25
## 351649 568712              6 RIBBONS RUSTIC CHARM        1 28/09/11 15:50  1.95
## 351679 568712               DOORMAT RED RETROSPOT        1 28/09/11 15:50  8.25
## 351686 568712    SET 3 RETROSPOT TEA,COFFEE,SUGAR        1 28/09/11 15:50  4.95
## 351714 568712 SET OF 3 WOODEN STOCKING DECORATION        1 28/09/11 15:50  1.25
## 351715 568712   SET OF 3 WOODEN HEART DECORATIONS        1 28/09/11 15:50  1.25
## 353628 568901    SMALL IVORY HEART WALL ORGANISER        6 29/09/11 13:22  5.75
## 353632 568901           ENAMEL WATERING CAN CREAM        2 29/09/11 13:22  4.95
## 353971 568938 SET/10 IVORY POLKADOT PARTY CANDLES        1 29/09/11 14:46  1.25
## 353976 568938   HEART WOODEN CHRISTMAS DECORATION        3 29/09/11 14:46  0.85
## 354579 568991       GREEN GOOSE FEATHER TREE 60CM        2 29/09/11 16:44  1.95
## 354602 568991             HAND WARMER BIRD DESIGN        1 29/09/11 16:44  2.10
## 354622 568991       WHITE GOOSE FEATHER TREE 60CM        2 29/09/11 16:44  1.95
## 355715 569105      METAL SIGN,CUPCAKE SINGLE HOOK        3 30/09/11 12:35  1.25
## 355982 569129            HOME BUILDING BLOCK WORD        1 30/09/11 13:40  6.25
## 355999 569129         ALARM CLOCK BAKELIKE ORANGE        1 30/09/11 13:40  3.75
## 356809 569205                IVORY KITCHEN SCALES        1 02/10/11 10:55  8.50
## 356855 569207  SILVER MUG BONE CHINA TREE OF LIFE        6 02/10/11 11:04  1.06
## 356987 569212       ASSORTED COLOUR BIRD ORNAMENT        8 02/10/11 12:05  1.69
## 357129 569217                      DOORMAT HEARTS        1 02/10/11 12:45  8.25
## 357137 569217    VINTAGE CREAM DOG FOOD CONTAINER        1 02/10/11 12:45  8.50
## 357170 569218                JUMBO BAG STRAWBERRY        2 02/10/11 12:47  2.08
## 357186 569219      PACK OF 12 CHRISTMAS FUN CARDS        1 02/10/11 13:01  2.95
## 357201 569219  SET OF 6 RIBBONS VINTAGE CHRISTMAS        1 02/10/11 13:01  2.89
## 357218 569219      SET 36 COLOUR PENCILS SPACEBOY        1 02/10/11 13:01  1.25
## 357219 569219      SET 36 COLOURING PENCILS DOILY        1 02/10/11 13:01  1.25
## 357229 569219        REX CASH+CARRY JUMBO SHOPPER        1 02/10/11 13:01  0.95
## 357272 569220         CHARLOTTE BAG PINK POLKADOT        1 02/10/11 13:26  0.85
## 357367 569220   SET 20 NAPKINS FAIRY CAKES DESIGN        1 02/10/11 13:26  0.85
## 357578 569224            ALARM CLOCK BAKELIKE RED        1 02/10/11 14:00  3.75
## 357585 569224         PACK OF 12 SPACEBOY TISSUES        1 02/10/11 14:00  0.39
## 357587 569224        SET OF 3 NOTEBOOKS IN PARCEL        1 02/10/11 14:00  1.65
## 357603 569224 KNITTED UNION FLAG HOT WATER BOTTLE        1 02/10/11 14:00  4.25
## 357626 569225 CERAMIC BOWL WITH LOVE HEART DESIGN        2 02/10/11 14:25  0.83
## 357713 569228        BLOSSOM IMAGES GIFT WRAP SET       12 02/10/11 14:47  0.65
## 357766 569229       HOME SWEET HOME HANGING HEART        2 02/10/11 14:56  0.85
## 357798 569229   SET OF 12 FAIRY CAKE BAKING CASES        1 02/10/11 14:56  0.83
## 357841 569229     PACK OF 12 PAISLEY PARK TISSUES        1 02/10/11 14:56  0.39
## 357843 569229       PACK OF 12 DOLLY GIRL TISSUES        1 02/10/11 14:56  0.39
## 357887 569230            REGENCY CAKESTAND 3 TIER        1 02/10/11 15:07 12.75
## 358061 569234          FOUR HOOK  WHITE LOVEBIRDS        1 02/10/11 15:33  2.10
## 358074 569234  ROUND SNACK BOXES SET OF4 WOODLAND        1 02/10/11 15:33  2.95
## 358078 569234             JUMBO BAG VINTAGE DOILY        1 02/10/11 15:33  2.08
## 358284 569243    SET OF 6 SNACK LOAF BAKING CASES        8  03/10/11 9:44  0.83
## 358285 569243    SET OF 6 SNACK LOAF BAKING CASES        8  03/10/11 9:44  0.83
## 358309 569243            HOME BUILDING BLOCK WORD        3  03/10/11 9:44  6.25
## 358897 569261               HEART OF WICKER SMALL        1 03/10/11 11:34  1.65
## 358906 569261    PLAYING CARDS JUBILEE UNION JACK        1 03/10/11 11:34  1.25
## 358927 569261               PINK DINER WALL CLOCK        1 03/10/11 11:34  8.50
## 358931 569261               SWEETHEART BIRD HOUSE        1 03/10/11 11:34  4.15
## 358935 569261            RED METAL BOX TOP SECRET        2 03/10/11 11:34  8.25
## 358944 569261       BLUE GIANT GARDEN THERMOMETER        1 03/10/11 11:34  5.95
## 358961 569261          ENAMEL MEASURING JUG CREAM        1 03/10/11 11:34  4.25
## 358972 569261         4 TRADITIONAL SPINNING TOPS        1 03/10/11 11:34  1.45
## 359049 569302          ALARM CLOCK BAKELIKE GREEN        1 03/10/11 12:04  3.75
## 359382 569332              PLASTERS IN TIN SKULLS        1 03/10/11 13:46  1.65
## 359386 569332  SET OF 2 TEA TOWELS PING MICROWAVE        1 03/10/11 13:46  2.95
## 359394 569332   ROUND SNACK BOXES SET OF 4 FRUITS        1 03/10/11 13:46  2.95
## 359396 569332              LUNCH BAG APPLE DESIGN        1 03/10/11 13:46  1.65
## 359397 569332      SET/2 RED RETROSPOT TEA TOWELS        1 03/10/11 13:46  3.25
## 359399 569332                  SPACEBOY LUNCH BOX        1 03/10/11 13:46  1.95
## 359709 569367   LE JARDIN BOTANIQUE CUSHION COVER        2 03/10/11 15:28  3.75
## 359736 569367            REGENCY CAKESTAND 3 TIER        1 03/10/11 15:28 12.75
## 359751 569367 CAKE STAND VICTORIAN FILIGREE SMALL        1 03/10/11 15:28  4.95
## 359758 569367       GLASS APOTHECARY BOTTLE TONIC        1 03/10/11 15:28  3.95
## 359762 569367                   GLASS BON BON JAR        1 03/10/11 15:28  1.95
## 359777 569367     GLASS APOTHECARY BOTTLE PERFUME        1 03/10/11 15:28  3.95
## 359778 569367      GLASS APOTHECARY BOTTLE ELIXIR        1 03/10/11 15:28  3.95
## 361054 569424          12 COLOURED PARTY BALLOONS       10 04/10/11 10:49  0.65
## 361055 569424          12 COLOURED PARTY BALLOONS       10 04/10/11 10:49  0.65
## 361322 569469      PACK OF 60 DINOSAUR CAKE CASES        3 04/10/11 12:22  0.55
## 361415 569469  CHARLIE LOLA BLUE HOT WATER BOTTLE        1 04/10/11 12:22  4.65
## 361506 569472   ANTIQUE SILVER TEA GLASS ENGRAVED        6 04/10/11 12:38  1.25
## 361511 569472   ANTIQUE SILVER TEA GLASS ENGRAVED        6 04/10/11 12:38  1.25
## 361514 569472        FLUTED ANTIQUE CANDLE HOLDER       12 04/10/11 12:38  0.85
## 361826 569491             LUNCH BAG VINTAGE DOILY        1 04/10/11 13:25  1.65
## 361957 569513               GRAND CHOCOLATECANDLE       18 04/10/11 13:55  1.45
## 362076 569521   DO NOT TOUCH MY STUFF DOOR HANGER        1 04/10/11 14:33  0.39
## 362077 569521      ROUND PURPLE CLOCK WITH SUCKER        1 04/10/11 14:33  0.19
## 362085 569521            36 PENCILS TUBE WOODLAND        1 04/10/11 14:33  1.25
## 362094 569521         MINI PLAYING CARDS SPACEBOY        1 04/10/11 14:33  0.42
## 362113 569521             WATERING CAN PINK BUNNY        1 04/10/11 14:33  1.95
## 362115 569521      VINTAGE  2 METER FOLDING RULER        1 04/10/11 14:33  1.65
## 362116 569521   DO NOT TOUCH MY STUFF DOOR HANGER        1 04/10/11 14:33  0.39
## 362118 569521        PLEASE ONE PERSON METAL SIGN        1 04/10/11 14:33  2.10
## 362121 569521   DO NOT TOUCH MY STUFF DOOR HANGER        1 04/10/11 14:33  0.39
## 362129 569521                   RATTLE SNAKE EGGS        1 04/10/11 14:33  1.25
## 362133 569521                           SPACE OWL        1 04/10/11 14:33  1.25
## 362141 569521      NATURAL SLATE HEART CHALKBOARD       12 04/10/11 14:33  2.95
## 362199 569523           COOK WITH WINE METAL SIGN        1 04/10/11 14:41  2.08
## 362243 569524           HEART IVORY TRELLIS SMALL        1 04/10/11 14:42  1.25
## 362283 569524   SET OF 6 SPICE TINS PANTRY DESIGN        1 04/10/11 14:42  3.95
## 362289 569524      RED ROCKING HORSE HAND PAINTED        1 04/10/11 14:42  1.25
## 362304 569524       SILVER STARS TABLE DECORATION        1 04/10/11 14:42  0.83
## 362306 569524       EMBROIDERED RIBBON REEL EMILY        1 04/10/11 14:42  2.08
## 362311 569524       SILVER STARS TABLE DECORATION        1 04/10/11 14:42  0.83
## 362320 569524             FRENCH ENAMEL POT W LID        1 04/10/11 14:42  2.95
## 362322 569524             PANTRY WASHING UP BRUSH        1 04/10/11 14:42  1.45
## 362330 569524      RED ROCKING HORSE HAND PAINTED        1 04/10/11 14:42  1.25
## 362332 569524 PAINTED METAL STAR WITH HOLLY BELLS        1 04/10/11 14:42  0.39
## 362335 569524    STAR WREATH DECORATION WITH BELL        1 04/10/11 14:42  1.25
## 362336 569524 PAINTED METAL HEART WITH HOLLY BELL        1 04/10/11 14:42  0.39
## 362362 569527  WHITE HANGING HEART T-LIGHT HOLDER        1 04/10/11 14:53  2.95
## 362368 569527      VINTAGE PAISLEY STATIONERY SET        1 04/10/11 14:53  1.25
## 362369 569527        SET OF 3 NOTEBOOKS IN PARCEL        1 04/10/11 14:53  1.65
## 362448 569528  FELTCRAFT HAIRBAND PINK AND PURPLE        3 04/10/11 14:53  0.85
## 362569 569533      ASSORTED TUTTI FRUTTI NOTEBOOK        2 04/10/11 15:21  2.10
## 363220 569546     RECIPE BOX PANTRY YELLOW DESIGN        1 04/10/11 16:39  2.95
## 363228 569546       WOODLAND BUNNIES LOLLY MAKERS        1 04/10/11 16:39  2.08
## 363238 569546       RED TOADSTOOL LED NIGHT LIGHT        1 04/10/11 16:39  1.65
## 363993 569641    ASSORTED MONKEY SUCTION CUP HOOK       12 05/10/11 12:27  0.42
## 364134 569651  PAPER LANTERN 9 POINT HOLLY STAR S        2 05/10/11 12:49  4.15
## 364143 569651  PLAYING CARDS KEEP CALM & CARRY ON        1 05/10/11 12:49  1.25
## 364145 569651           RIBBON REEL SNOWY VILLAGE        5 05/10/11 12:49  1.65
## 364146 569651       RIBBON REEL SOCKS AND MITTENS        5 05/10/11 12:49  1.65
## 364157 569651        RETROSPOT GIANT TUBE MATCHES        1 05/10/11 12:49  2.55
## 364163 569651           RED APPLES CHOPPING BOARD        1 05/10/11 12:49  4.95
## 364183 569651             WALL ART BICYCLE SAFETY        1 05/10/11 12:49  5.95
## 364458 569669       BISCUIT TIN VINTAGE CHRISTMAS        1 05/10/11 13:47  2.89
## 364466 569669            IVORY WICKER HEART LARGE        1 05/10/11 13:47  1.65
## 364472 569669  WHITE HANGING HEART T-LIGHT HOLDER        1 05/10/11 13:47  2.95
## 364474 569669           CARD HOLDER GINGHAM HEART        1 05/10/11 13:47  2.89
## 364481 569669            DOLLY GIRL MINI BACKPACK        1 05/10/11 13:47  4.15
## 364488 569669       ENGLISH ROSE GARDEN SECATEURS        1 05/10/11 13:47  0.79
## 364495 569669  SET/20 RED RETROSPOT PAPER NAPKINS        1 05/10/11 13:47  0.85
## 364506 569669    PLASTERS IN TIN WOODLAND ANIMALS        1 05/10/11 13:47  1.65
## 364511 569669     IVORY HANGING DECORATION  HEART        1 05/10/11 13:47  0.85
## 364512 569669           HEART FILIGREE DOVE LARGE        1 05/10/11 13:47  1.65
## 364514 569669             BLUE ROSE FABRIC MIRROR        1 05/10/11 13:47  1.25
## 364529 569669       HEART SHAPE WIRELESS DOORBELL        1 05/10/11 13:47  2.10
## 364559 569670     FELTCRAFT HAIRBAND RED AND BLUE        1 05/10/11 13:47  0.85
## 364567 569670     60 CAKE CASES VINTAGE CHRISTMAS        1 05/10/11 13:47  0.55
## 364576 569670              SPACEBOY MINI BACKPACK        1 05/10/11 13:47  4.15
## 364622 569670          RIBBON REEL MAKING SNOWMEN        1 05/10/11 13:47  1.65
## 364625 569670           VINTAGE CHRISTMAS BUNTING        2 05/10/11 13:47  4.95
## 364630 569670   MAGNETS PACK OF 4 VINTAGE COLLAGE        1 05/10/11 13:47  0.39
## 364632 569670       MINI PLAYING CARDS DOLLY GIRL        1 05/10/11 13:47  0.42
## 364633 569670   MAGNETS PACK OF 4 VINTAGE COLLAGE        1 05/10/11 13:47  0.39
## 364644 569670  ROUND SNACK BOXES SET OF4 WOODLAND        1 05/10/11 13:47  2.95
## 364646 569670  ROUND SNACK BOXES SET OF4 WOODLAND        1 05/10/11 13:47  2.95
## 364647 569670                DOLLY GIRL LUNCH BOX        1 05/10/11 13:47  1.95
## 364648 569670               CHRISTMAS TOILET ROLL        2 05/10/11 13:47  1.25
## 364655 569670    SET 36 COLOUR PENCILS DOLLY GIRL        1 05/10/11 13:47  1.25
## 364656 569670        COSY HOUR GIANT TUBE MATCHES        2 05/10/11 13:47  2.55
## 364785 569673 GARDENIA 1 WICK MORRIS BOXED CANDLE        6 05/10/11 13:58  4.25
## 365523 569714         I LOVE LONDON MINI BACKPACK        1 05/10/11 17:28  4.15
## 366144 569823      VINTAGE BILLBOARD DRINK ME MUG        4 06/10/11 12:15  1.25
## 366147 569823           ZINC FOLKART SLEIGH BELLS        1 06/10/11 12:15  1.69
## 366152 569823             LUNCH BAG  BLACK SKULL.        1 06/10/11 12:15  1.65
## 366159 569823         BOX OF 6 MINI 50'S CRACKERS        2 06/10/11 12:15  2.49
## 366164 569823                 KEY FOB , BACK DOOR        1 06/10/11 12:15  0.65
## 366169 569823              PLASTERS IN TIN SKULLS        1 06/10/11 12:15  1.65
## 366170 569823      SET OF 9 HEART SHAPED BALLOONS        1 06/10/11 12:15  1.25
## 366516 569843      GAOLERS KEYS DECORATIVE GARDEN        1 06/10/11 13:29  3.75
## 366529 569843               SWEETHEART BIRD HOUSE        1 06/10/11 13:29  4.15
## 366532 569843            JUMBO BAG 50'S CHRISTMAS        2 06/10/11 13:29  2.08
## 366544 569843  RED CHARLIE+LOLA PERSONAL DOORSIGN        5 06/10/11 13:29  0.39
## 366561 569843       WOOD STAMP SET HAPPY BIRTHDAY        1 06/10/11 13:29  0.83
## 367000 569866                  PINK PADDED MOBILE        1 06/10/11 14:50  4.25
## 367069 569866   SET 12 COLOUR PENCILS LOVE LONDON        1 06/10/11 14:50  0.65
## 367090 569866        BUNDLE OF 3 RETRO NOTE BOOKS        1 06/10/11 14:50  1.65
## 367091 569866      SMALL PURPLE BABUSHKA NOTEBOOK        1 06/10/11 14:50  0.85
## 367133 569866                BLUE PAISLEY JOURNAL        1 06/10/11 14:50  2.55
## 367139 569866                BLUE PAISLEY JOURNAL        1 06/10/11 14:50  2.55
## 367164 569866      WHITE WOOD GARDEN PLANT LADDER        1 06/10/11 14:50  9.95
## 367479 569897    PLASTERS IN TIN WOODLAND ANIMALS        1 06/10/11 16:01  1.65
## 367533 569897       WOODEN HAPPY BIRTHDAY GARLAND        1 06/10/11 16:01  2.95
## 367549 569897             DANISH ROSE PHOTO FRAME        1 06/10/11 16:01  0.79
## 367555 569897        SET OF 3 NOTEBOOKS IN PARCEL        1 06/10/11 16:01  1.65
## 367563 569897      12 RED ROSE PEG PLACE SETTINGS        1 06/10/11 16:01  1.25
## 367568 569897        SET OF 3 NOTEBOOKS IN PARCEL        1 06/10/11 16:01  1.65
## 367574 569897          JIGSAW TREE WITH BIRDHOUSE        1 06/10/11 16:01  0.59
## 367585 569897 12 PENCILS SMALL TUBE RED RETROSPOT        1 06/10/11 16:01  0.65
## 367586 569897      12 RED ROSE PEG PLACE SETTINGS        1 06/10/11 16:01  1.25
## 367593 569897        BOX OF VINTAGE JIGSAW BLOCKS        1 06/10/11 16:01  5.95
## 367603 569897        TREASURE TIN GYMKHANA DESIGN        1 06/10/11 16:01  2.08
## 367608 569897        HEADS AND TAILS SPORTING FUN        1 06/10/11 16:01  1.25
## 367612 569897      VINTAGE PAISLEY STATIONERY SET        1 06/10/11 16:01  1.25
## 367614 569897        HOMEMADE JAM SCENTED CANDLES       12 06/10/11 16:01  1.45
## 367618 569897              WHITE LOVEBIRD LANTERN        1 06/10/11 16:01  2.95
## 367629 569897         VICTORIAN SEWING BOX MEDIUM        1 06/10/11 16:01  7.95
## 367651 569897           RIBBON REEL HEARTS DESIGN        5 06/10/11 16:01  1.65
## 367653 569897               CHOCOLATE BOX RIBBONS        1 06/10/11 16:01  1.25
## 367655 569897                 URBAN BLACK RIBBONS        1 06/10/11 16:01  1.25
## 367660 569897       SET OF 6 HERB TINS SKETCHBOOK        1 06/10/11 16:01  3.95
## 367693 569897       LETTER HOLDER HOME SWEET HOME        1 06/10/11 16:01  3.75
## 368038 569901        CHILDRENS CUTLERY DOLLY GIRL        1 06/10/11 16:20  4.15
## 368334 569943   PINK CREAM FELT CRAFT TRINKET BOX        1 06/10/11 18:08  1.25
## 368578 570007                  RED RETROSPOT BOWL        8  07/10/11 9:26  1.25
## 368634 570009           LUNCH BAG SPACEBOY DESIGN       10  07/10/11 9:38  1.65
## 368701 570019        SKULL LUNCH BOX WITH CUTLERY        1 07/10/11 10:13  2.55
## 368704 570019                  SPACEBOY LUNCH BOX        1 07/10/11 10:13  1.95
## 368716 570019      PACK OF 60 MUSHROOM CAKE CASES        1 07/10/11 10:13  0.55
## 368732 570019     KEY RING BASEBALL BOOT ASSORTED        1 07/10/11 10:13  1.25
## 368733 570019     KEY RING BASEBALL BOOT ASSORTED        1 07/10/11 10:13  1.25
## 369224 570093        REX CASH+CARRY JUMBO SHOPPER        1 07/10/11 11:55  0.95
## 369226 570093        REX CASH+CARRY JUMBO SHOPPER        1 07/10/11 11:55  0.95
## 369231 570093         RETROSPOT CIGAR BOX MATCHES        1 07/10/11 11:55  1.25
## 369240 570093   LOVEBIRD HANGING DECORATION WHITE        1 07/10/11 11:55  0.85
## 369246 570093                GIRAFFE WOODEN RULER        1 07/10/11 11:55  1.95
## 369370 570103               WALL ART STOP FOR TEA        1 07/10/11 12:18  5.95
## 369582 570116        HEADS AND TAILS SPORTING FUN        1 07/10/11 12:38  1.25
## 369893 570168     DRAWER KNOB CRACKLE GLAZE IVORY        1 07/10/11 14:05  1.65
## 370041 570179           RIBBON REEL FLORA + FAUNA       10 07/10/11 14:27  1.65
## 370618 570197     PURPLE/COPPER HANGING LAMPSHADE        1 07/10/11 15:45  0.85
## 370631 570197                     PHOTO CLIP LINE        1 07/10/11 15:45  1.25
## 370632 570197                     PHOTO CLIP LINE        1 07/10/11 15:45  1.25
## 370634 570197     PURPLE/COPPER HANGING LAMPSHADE        1 07/10/11 15:45  0.85
## 370636 570197               LUNCH BAG SUKI DESIGN        1 07/10/11 15:45  1.65
## 370638 570197           SWALLOW SQUARE TISSUE BOX        1 07/10/11 15:45  0.39
## 370652 570197 CERAMIC BOWL WITH LOVE HEART DESIGN        1 07/10/11 15:45  0.83
## 370659 570197           TRIANGULAR POUFFE VINTAGE        1 07/10/11 15:45 14.95
## 370662 570197     50CM METAL STRING WITH  7 CLIPS        1 07/10/11 15:45  0.85
## 370677 570197      METAL SIGN,CUPCAKE SINGLE HOOK        1 07/10/11 15:45  1.25
## 370680 570197 CERAMIC BOWL WITH LOVE HEART DESIGN        1 07/10/11 15:45  0.83
## 370707 570197                   SPACE CADET BLACK        1 07/10/11 15:45  1.25
## 370717 570197           LUNCH BAG SPACEBOY DESIGN        1 07/10/11 15:45  1.65
## 370720 570197          SET OF 10 LED DOLLY LIGHTS        1 07/10/11 15:45  6.25
## 370780 570208  PAPER LANTERN 9 POINT HOLLY STAR S        1 09/10/11 10:23  4.15
## 370811 570209                FELTCRAFT DOLL EMILY        1 09/10/11 10:29  2.95
## 370818 570209      FELTCRAFT PRINCESS OLIVIA DOLL        1 09/10/11 10:29  3.75
## 370820 570209    PINK BLUE FELT CRAFT TRINKET BOX        2 09/10/11 10:29  1.25
## 370862 570210          WOOD STAMP SET BEST WISHES        1 09/10/11 10:48  0.83
## 370868 570210            PANTRY HOOK TEA STRAINER        1 09/10/11 10:48  2.08
## 370881 570210                 PANTRY PASTRY BRUSH        1 09/10/11 10:48  1.25
## 370882 570210       CHRISTMAS TREE T-LIGHT HOLDER        1 09/10/11 10:48  1.45
## 370893 570210       SET OF 5 MINI GROCERY MAGNETS        1 09/10/11 10:48  2.08
## 370910 570210                STAR  T-LIGHT HOLDER        1 09/10/11 10:48  1.45
## 370939 570211      DECORATIVE WICKER HEART MEDIUM        1 09/10/11 11:15  1.25
## 370994 570214  SET/20 RED RETROSPOT PAPER NAPKINS        1 09/10/11 11:50  0.85
## 371000 570214   RED FLORAL FELTCRAFT SHOULDER BAG        1 09/10/11 11:50  3.75
## 371002 570214   WORLD WAR 2 GLIDERS ASSTD DESIGNS       96 09/10/11 11:50  0.29
## 371005 570214        BAKING SET 9 PIECE RETROSPOT        2 09/10/11 11:50  4.95
## 371036 570215       6 GIFT TAGS VINTAGE CHRISTMAS        1 09/10/11 11:53  0.83
## 371199 570223       CHOCOLATE THIS WAY METAL SIGN        1 09/10/11 13:11  2.10
## 371218 570223 SET OF TEA COFFEE SUGAR TINS PANTRY        1 09/10/11 13:11  4.95
## 371234 570223    SET OF 2 ROUND TINS DUTCH CHEESE        1 09/10/11 13:11  2.95
## 371235 570223       SET OF 2 ROUND TINS CAMEMBERT        1 09/10/11 13:11  2.95
## 371473 570230  SET/10 BLUE POLKADOT PARTY CANDLES        1 09/10/11 13:41  1.25
## 371480 570230              GLITTER CHRISTMAS STAR        1 09/10/11 13:41  0.39
## 371561 570232          FAWN BLUE HOT WATER BOTTLE        2 09/10/11 13:58  3.75
## 371573 570232       ENGLISH ROSE HOT WATER BOTTLE        2 09/10/11 13:58  4.25
## 371582 570232               DOORMAT RED RETROSPOT        3 09/10/11 13:58  8.25
## 371618 570234      DECORATIVE WICKER HEART MEDIUM        1 09/10/11 14:22  1.25
## 371662 570235 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN        1 09/10/11 14:30  1.25
## 371665 570235           HEART FILIGREE DOVE LARGE        1 09/10/11 14:30  1.65
## 371668 570235  BLUE DRAWER KNOB ACRYLIC EDWARDIAN        1 09/10/11 14:30  1.25
## 371670 570235     DRAWER KNOB CRACKLE GLAZE IVORY        1 09/10/11 14:30  1.65
## 371820 570241   PINK CREAM FELT CRAFT TRINKET BOX        1 09/10/11 15:24  1.25
## 371854 570241       DROP EARRINGS W FLOWER & LEAF        1 09/10/11 15:24  2.55
## 371880 570242    CHRISTMAS HANGING STAR WITH BELL       96 09/10/11 15:40  0.39
## 371911 570244             SET OF 6 T-LIGHTS SANTA        6 09/10/11 16:05  2.95
## 371916 570244          FAMILY PHOTO FRAME CORNICE        1 09/10/11 16:05  9.95
## 371923 570244           HEART FILIGREE DOVE LARGE       12 09/10/11 16:05  1.65
## 371924 570244             SET OF 6 T-LIGHTS SANTA        6 09/10/11 16:05  2.95
## 371978 570246               BLUE CALCULATOR RULER        1 09/10/11 16:22  1.25
## 371986 570246 SET/5 RED RETROSPOT LID GLASS BOWLS        2 09/10/11 16:22  2.95
## 372008 570246    SET OF 3 BIRD LIGHT PINK FEATHER       12 09/10/11 16:22  0.39
## 372014 570246 CERAMIC BOWL WITH LOVE HEART DESIGN        1 09/10/11 16:22  0.83
## 372015 570246  WHITE GOOSE FEATHER CHRISTMAS TREE        1 09/10/11 16:22  2.95
## 372728 570333      HANGING PHOTO CLIP ROPE LADDER        1 10/10/11 12:19  1.65
## 372742 570333      YOU'RE CONFUSING ME METAL SIGN        1 10/10/11 12:19  1.69
## 372751 570333       SILVER STARS TABLE DECORATION        1 10/10/11 12:19  0.83
## 372762 570333 SILVER GLITTER FLOWER VOTIVE HOLDER        6 10/10/11 12:19  0.29
## 372895 570374          PACK OF SIX LED TEA LIGHTS        6 10/10/11 12:34  2.89
## 372956 570404            SKULLS SQUARE TISSUE BOX        1 10/10/11 12:50  0.39
## 372982 570404        REX CASH+CARRY JUMBO SHOPPER        1 10/10/11 12:50  0.95
## 372987 570404         PACK OF 72 SKULL CAKE CASES        1 10/10/11 12:50  0.55
## 373051 570410  SET OF 60 PANTRY DESIGN CAKE CASES        1 10/10/11 13:04  0.55
## 373058 570410       MAGNETS PACK OF 4 RETRO PHOTO        1 10/10/11 13:04  0.39
## 373075 570410         PACK OF 72 SKULL CAKE CASES        2 10/10/11 13:04  0.55
## 373079 570410           MEMO BOARD COTTAGE DESIGN        1 10/10/11 13:04  4.95
## 373099 570410   DOLLY MIXTURE CHILDREN'S UMBRELLA        3 10/10/11 13:04  3.25
## 373174 570414               SWEETHEART BIRD HOUSE        2 10/10/11 13:17  4.15
## 373267 570420      BELLE JARDINIERE CUSHION COVER        2 10/10/11 13:33  3.75
## 373280 570420  SET/10 PINK POLKADOT PARTY CANDLES        1 10/10/11 13:33  1.25
## 373370 570423         CHRISTMAS MUSICAL ZINC TREE        1 10/10/11 13:38  0.29
## 373374 570423                 LUNCH BAG CARS BLUE        2 10/10/11 13:38  1.65
## 373385 570423      PAPER CHAIN KIT 50'S CHRISTMAS        3 10/10/11 13:38  2.95
## 373408 570423   PINK CREAM FELT CRAFT TRINKET BOX        5 10/10/11 13:38  1.25
## 373524 570428            REGENCY SUGAR BOWL GREEN        2 10/10/11 14:02  4.15
## 373609 570442                 HOME SWEET HOME MUG        1 10/10/11 14:37  1.65
## 373614 570442     60 CAKE CASES VINTAGE CHRISTMAS        1 10/10/11 14:37  0.55
## 373839 570455   SET OF 3 WOODEN HEART DECORATIONS        1 10/10/11 15:27  1.25
## 373842 570455    SET OF 3 WOODEN TREE DECORATIONS        1 10/10/11 15:27  1.25
## 373876 570455     PLASTERS IN TIN VINTAGE PAISLEY        1 10/10/11 15:27  1.65
## 373879 570455      SET/4 SPRING FLOWER DECORATION        1 10/10/11 15:27  0.75
## 373887 570455        DOVE DECORATION PAINTED ZINC        2 10/10/11 15:27  0.19
## 373891 570455          BISCUIT TIN 50'S CHRISTMAS        1 10/10/11 15:27  2.89
## 373894 570455               LOVE HOT WATER BOTTLE        1 10/10/11 15:27  5.95
## 373899 570455          BISCUIT TIN 50'S CHRISTMAS        1 10/10/11 15:27  2.89
## 373910 570455        SET OF 3 NOTEBOOKS IN PARCEL        1 10/10/11 15:27  1.65
## 373912 570455       WOOD STAMP SET HAPPY BIRTHDAY        2 10/10/11 15:27  0.83
## 373913 570455            WOOD STAMP SET THANK YOU        1 10/10/11 15:27  0.83
## 373983 570458          RIBBON REEL STRIPES DESIGN        5 10/10/11 15:39  1.65
## 375264 570500    SET 6 PAPER TABLE LANTERN HEARTS        2  11/10/11 9:19  3.75
## 375312 570503        EMBROIDERED RIBBON REEL RUBY        1  11/10/11 9:26  3.75
## 376268 570664      DRAWER KNOB VINTAGE GLASS STAR        1 11/10/11 14:21  2.08
## 376280 570664          RIBBON REEL STRIPES DESIGN        2 11/10/11 14:21  1.65
## 376645 570677       FRENCH BLUE METAL DOOR SIGN 9        2 11/10/11 15:10  1.25
## 376758 570680   RIBBON REEL CHRISTMAS SOCK BAUBLE        1 11/10/11 15:36  1.65
## 377084 570688      METAL SIGN,CUPCAKE SINGLE HOOK        1 11/10/11 16:29  2.46
## 377404 570693         FELTCRAFT BOY JEAN-PAUL KIT        3 11/10/11 16:50  4.95
## 377647 570719                FELTCRAFT DOLL MOLLY        1 12/10/11 10:45  2.95
## 377870 570791          LARGE DECO JEWELLERY STAND        1 12/10/11 11:58 12.50
## 378171 570818         RED RETROSPOT CHARLOTTE BAG        2 12/10/11 12:47  0.85
## 378173 570818             LUNCH BAG  BLACK SKULL.        1 12/10/11 12:47  1.65
## 378175 570818           CHARLOTTE BAG SUKI DESIGN        1 12/10/11 12:47  0.85
## 378177 570818              PLASTERS IN TIN SKULLS        1 12/10/11 12:47  1.65
## 378183 570818      SET OF 4 ENGLISH ROSE COASTERS        1 12/10/11 12:47  1.25
## 378189 570818   SET OF 3 WOODEN HEART DECORATIONS        4 12/10/11 12:47  1.25
## 378191 570818 SET OF 3 WOODEN STOCKING DECORATION        4 12/10/11 12:47  1.25
## 378192 570818    SET OF 3 WOODEN TREE DECORATIONS        4 12/10/11 12:47  1.25
## 378278 570827              VINTAGE KID DOLLY CARD       12 12/10/11 13:14  0.42
## 378299 570827        TREASURE TIN GYMKHANA DESIGN        1 12/10/11 13:14  2.08
## 378490 570842             LUNCH BAG RED RETROSPOT       10 12/10/11 14:21  1.65
## 379520 570888   PINK CREAM FELT CRAFT TRINKET BOX       12 13/10/11 10:26  1.25
## 379798 571028    RED HANGING HEART T-LIGHT HOLDER        2 13/10/11 12:21  2.95
## 379915 571032         FRENCH LAVENDER SCENT HEART        3 13/10/11 12:38  0.75
## 380145 571039                HOT BATHS METAL SIGN        1 13/10/11 12:59  2.10
## 380157 571039 SET/5 RED RETROSPOT LID GLASS BOWLS        1 13/10/11 12:59  2.95
## 380161 571039             LUNCH BAG VINTAGE DOILY        1 13/10/11 12:59  1.65
## 380201 571039        REX CASH+CARRY JUMBO SHOPPER        1 13/10/11 12:59  0.95
## 380215 571039        REX CASH+CARRY JUMBO SHOPPER        3 13/10/11 12:59  0.95
## 380332 571046                FEATHER PEN,HOT PINK       12 13/10/11 13:35  0.39
## 380345 571046    MAGNETS PACK OF 4 VINTAGE LABELS        1 13/10/11 13:35  0.39
## 380351 571046              EDWARDIAN PARASOL PINK        1 13/10/11 13:35  5.95
## 380355 571046          COTTON APRON PANTRY DESIGN        1 13/10/11 13:35  4.95
## 380362 571046               CHRISTMAS TOILET ROLL        2 13/10/11 13:35  1.25
## 380378 571046            DOLLY GIRL MINI BACKPACK        1 13/10/11 13:35  4.15
## 380381 571046      BLUE STONES ON WIRE FOR CANDLE        4 13/10/11 13:35  0.08
## 380392 571046          WOODEN ROUNDERS GARDEN SET        2 13/10/11 13:35  9.95
## 380460 571054    SET OF 3 WOODEN TREE DECORATIONS        1 13/10/11 13:58  1.25
## 380465 571054     HEART DECORATION RUSTIC HANGING        1 13/10/11 13:58  0.19
## 380468 571054         SINGLE WIRE HOOK PINK HEART        1 13/10/11 13:58  1.45
## 380470 571054      CHERUB HEART DECORATION SILVER        1 13/10/11 13:58  0.83
## 380483 571054      REINDEER HEART DECORATION GOLD        1 13/10/11 13:58  0.83
## 380491 571054    SET OF 3 WOODEN TREE DECORATIONS        1 13/10/11 13:58  1.25
## 380494 571054           ZINC FOLKART SLEIGH BELLS        1 13/10/11 13:58  1.69
## 380503 571054        COLOURING PENCILS BROWN TUBE        1 13/10/11 13:58  1.25
## 380560 571054              GARDEN PATH SKETCHBOOK        1 13/10/11 13:58  3.75
## 380566 571054             ABSTRACT CIRCLE JOURNAL        1 13/10/11 13:58  2.55
## 380567 571054              CHRYSANTHEMUM  JOURNAL        1 13/10/11 13:58  2.55
## 380568 571054            CHRYSANTHEMUM SKETCHBOOK        1 13/10/11 13:58  3.75
## 380789 571061                  JUMBO BAG ALPHABET        6 13/10/11 14:33  4.13
## 380996 571081        HANGING ENGRAVED METAL HEART        1 13/10/11 15:23  4.15
## 381236 571098      NATURAL SLATE HEART CHALKBOARD        7 13/10/11 15:38  2.95
## 381336 571105   3 WHITE CHOC MORRIS BOXED CANDLES        1 13/10/11 16:01  1.25
## 381359 571105      SET 36 COLOUR PENCILS SPACEBOY        2 13/10/11 16:01  1.25
## 381626 571123                   WALL ART BIG LOVE        3  14/10/11 9:35  6.95
## 381723 571178          GYMKHANA TREASURE BOOK BOX        1 14/10/11 10:38  2.25
## 381843 571183  SMALL DOLLY MIX DESIGN ORANGE BOWL        8 14/10/11 11:08  0.42
## 382229 571212           DAIRY MAID LARGE MILK JUG        1 14/10/11 12:53  4.95
## 382357 571216                 WHITE METAL LANTERN        1 14/10/11 13:06  3.75
## 382364 571216     GREEN REGENCY TEACUP AND SAUCER        1 14/10/11 13:06  2.95
## 382373 571216          JAZZ HEARTS PURSE NOTEBOOK        1 14/10/11 13:06  0.39
## 382403 571216          JAZZ HEARTS PURSE NOTEBOOK        1 14/10/11 13:06  0.39
## 382612 571229       DECORATIVE WICKER HEART LARGE        1 14/10/11 14:04  1.65
## 382625 571229    SET OF 3 WOODEN TREE DECORATIONS        1 14/10/11 14:04  1.25
## 382788 571241   SET/3 CHRISTMAS DECOUPAGE CANDLES        1 14/10/11 14:58  0.95
## 382813 571241                DOLLY GIRL LUNCH BOX        1 14/10/11 14:58  1.95
## 382814 571241           FELTCRAFT CHRISTMAS FAIRY        1 14/10/11 14:58  4.25
## 382815 571241                LADS ONLY TISSUE BOX        3 14/10/11 14:58  0.39
## 382816 571241        SET OF 6 T-LIGHTS TOADSTOOLS        1 14/10/11 14:58  2.95
## 383299 571265           TV DINNER TRAY DOLLY GIRL        1 16/10/11 11:31  4.95
## 383315 571265       6 GIFT TAGS VINTAGE CHRISTMAS        2 16/10/11 11:31  0.83
## 383316 571265          6 GIFT TAGS 50'S CHRISTMAS        2 16/10/11 11:31  0.83
## 383379 571268          BISCUIT TIN 50'S CHRISTMAS        6 16/10/11 12:06  2.89
## 383450 571270      DECORATIVE WICKER HEART MEDIUM        2 16/10/11 12:09  1.25
## 383456 571270      4 WILDFLOWER BOTANICAL CANDLES        2 16/10/11 12:09  1.25
## 383469 571270    RED HANGING HEART T-LIGHT HOLDER        3 16/10/11 12:09  2.95
## 383535 571272      SILVER HEARTS TABLE DECORATION       12 16/10/11 12:19  0.83
## 383622 571274      SET OF 2 TRAYS HOME SWEET HOME        2 16/10/11 12:25  9.95
## 383629 571275          GYMKHANA TREASURE BOOK BOX        1 16/10/11 12:28  2.25
## 383630 571275            TREASURE ISLAND BOOK BOX        1 16/10/11 12:28  2.25
## 383654 571275               SWEETHEART BIRD HOUSE        2 16/10/11 12:28  4.15
## 383753 571279    HOME SWEET HOME 2 DRAWER CABINET        1 16/10/11 12:54  4.95
## 383960 571282         VINTAGE RED ENAMEL TRIM JUG        1 16/10/11 13:24  3.75
## 384102 571286       CHOCOLATE THIS WAY METAL SIGN        1 16/10/11 14:35  2.10
## 384115 571286             PINK GLASS CANDLEHOLDER        1 16/10/11 14:35  2.95
## 384117 571286              NAMASTE SWAGAT INCENSE        6 16/10/11 14:35  0.30
## 384118 571286              NAMASTE SWAGAT INCENSE        6 16/10/11 14:35  0.30
## 384119 571286              NAMASTE SWAGAT INCENSE        6 16/10/11 14:35  0.30
## 384171 571286        HOME SWEET HOME 3 PEG HANGER        1 16/10/11 14:35  3.75
## 384172 571286    HOME SWEET HOME 2 DRAWER CABINET        1 16/10/11 14:35  4.95
## 384274 571289    SMALL IVORY HEART WALL ORGANISER        6 16/10/11 15:27  5.75
## 384278 571289        T-LIGHT GLASS FLUTED ANTIQUE       24 16/10/11 15:27  1.25
## 384282 571289      NATURAL SLATE HEART CHALKBOARD       12 16/10/11 15:27  2.95
## 384316 571291     DRAWER KNOB CRACKLE GLAZE IVORY        6 16/10/11 15:44  1.65
## 384318 571291  PINK DRAWER KNOB ACRYLIC EDWARDIAN       12 16/10/11 15:44  1.25
## 384343 571291                 DOORMAT BLACK FLOCK        1 16/10/11 15:44  8.25
## 384876 571317      72 SWEETHEART FAIRY CAKE CASES        3 17/10/11 10:48  0.55
## 384877 571317     PACK OF 72 RETROSPOT CAKE CASES        3 17/10/11 10:48  0.55
## 384878 571317     60 CAKE CASES DOLLY GIRL DESIGN        3 17/10/11 10:48  0.55
## 385121 571372          12 COLOURED PARTY BALLOONS        1 17/10/11 11:55  0.65
## 385131 571372          SLATE TILE NATURAL HANGING       36 17/10/11 11:55  1.45
## 385242 571408         FOOD COVER WITH BEADS SET 2        1 17/10/11 12:22  3.75
## 385246 571408          ENAMEL MEASURING JUG CREAM        1 17/10/11 12:22  4.25
## 385256 571408               LONDON BUS COFFEE MUG        1 17/10/11 12:22  2.55
## 385262 571408        BAKING SET 9 PIECE RETROSPOT        1 17/10/11 12:22  4.95
## 385340 571418         SMALL WHITE HEART OF WICKER        1 17/10/11 12:35  1.65
## 385353 571418    SINGLE HEART ZINC T-LIGHT HOLDER        1 17/10/11 12:35  1.25
## 385356 571418     CERAMIC CAKE DESIGN SPOTTED MUG        1 17/10/11 12:35  1.49
## 385365 571418             CREAM HEART CARD HOLDER        1 17/10/11 12:35  3.95
## 385368 571418        LARGE CIRCULAR MIRROR MOBILE        6 17/10/11 12:35  1.25
## 385417 571429            CHRYSANTHEMUM SKETCHBOOK        1 17/10/11 12:50  3.75
## 385498 571433    SET OF 6 SNACK LOAF BAKING CASES        8 17/10/11 13:19  0.83
## 386072 571442      CLOTHES PEGS RETROSPOT PACK 24        3 17/10/11 13:39  1.65
## 386229 571461            JUMBO BAG 50'S CHRISTMAS        1 17/10/11 14:12  2.08
## 386234 571461  SET/3 OCEAN SCENT CANDLE JEWEL BOX        1 17/10/11 14:12  4.25
## 386235 571461             LUNCH BAG  BLACK SKULL.        1 17/10/11 14:12  1.65
## 386241 571461             LUNCH BAG  BLACK SKULL.        1 17/10/11 14:12  1.65
## 386248 571461            JUMBO BAG 50'S CHRISTMAS        1 17/10/11 14:12  2.08
## 386296 571464       DOORMAT KEEP CALM AND COME IN        1 17/10/11 14:28  8.25
## 386321 571465          RIBBON REEL MAKING SNOWMEN        5 17/10/11 14:29  1.65
## 386436 571475        REX CASH+CARRY JUMBO SHOPPER        1 17/10/11 14:42  0.95
## 386621 571498                FELTCRAFT DOLL ROSIE        1 17/10/11 15:06  2.95
## 386751 571502       SET OF 4 FAIRY CAKE PLACEMATS        4 17/10/11 15:18  3.75
## 387722 571642        RETROSPOT SMALL TUBE MATCHES        1 18/10/11 12:07  1.65
## 387961 571654  FAIRY CAKE FLANNEL ASSORTED COLOUR        1 18/10/11 12:17  0.79
## 388036 571656     CHILDRENS APRON SPACEBOY DESIGN        1 18/10/11 12:43  1.95
## 388204 571667            RED RETROSPOT MINI CASES        1 18/10/11 13:04  7.95
## 388217 571667       ROMANTIC IMAGES GIFT WRAP SET        1 18/10/11 13:04  0.65
## 388219 571667              WOODLAND MINI BACKPACK        1 18/10/11 13:04  4.15
## 388220 571667            DOLLY GIRL MINI BACKPACK        1 18/10/11 13:04  4.15
## 388277 571669     TRAVEL CARD WALLET VINTAGE LEAF       15 18/10/11 13:11  0.42
## 388286 571669               RAIN PONCHO RETROSPOT        3 18/10/11 13:11  0.85
## 388300 571669     HOT WATER BOTTLE I AM SO POORLY        2 18/10/11 13:11  4.95
## 388640 571679           TRAVEL CARD WALLET PANTRY        2 18/10/11 13:41  0.42
## 388757 571682      TOILET SIGN OCCUPIED OR VACANT        1 18/10/11 14:00  0.83
## 388779 571682               ABC TREASURE BOOK BOX        1 18/10/11 14:00  2.25
## 388780 571682      TOILET SIGN OCCUPIED OR VACANT        1 18/10/11 14:00  0.83
## 388802 571682     RETROSPOT TEA SET CERAMIC 11 PC        1 18/10/11 14:00  4.95
## 388812 571682      BUFFALO BILL TREASURE BOOK BOX        1 18/10/11 14:00  2.25
## 388814 571682               ABC TREASURE BOOK BOX        1 18/10/11 14:00  2.25
## 390447 571779          WOODEN SKITTLES GARDEN SET        1 19/10/11 11:27 15.95
## 390457 571779                   GUMBALL COAT RACK        1 19/10/11 11:27  2.55
## 390656 571809                 WHITE METAL LANTERN        1 19/10/11 11:44  3.75
## 390657 571809     CERAMIC PIRATE CHEST MONEY BANK        8 19/10/11 11:44  1.45
## 390875 571837         MINI PLAYING CARDS SPACEBOY        1 19/10/11 12:11  0.42
## 390889 571837      SET OF 6 3D KIT CARDS FOR KIDS        1 19/10/11 12:11  0.85
## 390894 571837      SET OF 6 3D KIT CARDS FOR KIDS        1 19/10/11 12:11  0.85
## 390895 571837               RED  HARMONICA IN BOX        1 19/10/11 12:11  1.25
## 390908 571837      ROTATING LEAVES T-LIGHT HOLDER        2 19/10/11 12:11  1.25
## 390928 571837                     SPACEBOY BEAKER        3 19/10/11 12:11  1.25
## 391020 571841      DECORATIVE WICKER HEART MEDIUM        2 19/10/11 12:21  1.25
## 391084 571845               SWEETHEART BIRD HOUSE        2 19/10/11 12:34  4.15
## 391124 571846             GLITTER BUTTERFLY CLIPS        1 19/10/11 12:35  2.55
## 391139 571846          SMALL CHOCOLATES PINK BOWL        1 19/10/11 12:35  0.42
## 391157 571846         SMALL WHITE HEART OF WICKER        1 19/10/11 12:35  1.65
## 391158 571846               HEART OF WICKER SMALL        1 19/10/11 12:35  1.65
## 391445 571883            PLACE SETTING WHITE STAR        1 19/10/11 13:58  0.42
## 391474 571883  SET OF 3 WOODEN SLEIGH DECORATIONS        1 19/10/11 13:58  1.25
## 391475 571883    SET OF 3 WOODEN TREE DECORATIONS        1 19/10/11 13:58  1.25
## 391481 571883        CURIOUS IMAGES GIFT WRAP SET        1 19/10/11 13:58  0.65
## 391489 571883     WHITE CHRISTMAS STAR DECORATION        1 19/10/11 13:58  0.42
## 391493 571883   SET OF 3 WOODEN HEART DECORATIONS        2 19/10/11 13:58  1.25
## 391506 571883    ANTIQUE GLASS DRESSING TABLE POT        1 19/10/11 13:58  2.95
## 391507 571883 ANTIQUE TALL SWIRLGLASS TRINKET POT        1 19/10/11 13:58  3.75
## 391599 571899 GARDENIA 1 WICK MORRIS BOXED CANDLE        2 19/10/11 14:22  1.25
## 391614 571899         LARGE WHITE HEART OF WICKER        1 19/10/11 14:22  2.95
## 391685 571909                 MOTORING TISSUE BOX        1 19/10/11 15:08  0.39
## 391698 571909   METAL DECORATION NAUGHTY CHILDREN        1 19/10/11 15:08  0.85
## 391705 571909      TEATIME ROUND PENCIL SHARPENER        1 19/10/11 15:08  0.12
## 391716 571909                    HEART CALCULATOR        1 19/10/11 15:08  1.25
## 391723 571909      VINTAGE  2 METRE FOLDING RULER        1 19/10/11 15:08  1.65
## 391736 571909                 BLOND DOLL DOORSTOP        2 19/10/11 15:08  1.25
## 391739 571909                 BLOND DOLL DOORSTOP        2 19/10/11 15:08  1.25
## 391743 571909           BLUE POLKADOT LUGGAGE TAG        1 19/10/11 15:08  1.25
## 391772 571909     HOT WATER BOTTLE I AM SO POORLY        1 19/10/11 15:08  4.95
## 391773 571909           BLUE POLKADOT LUGGAGE TAG        1 19/10/11 15:08  1.25
## 391783 571909              TOAST ITS - I LOVE YOU        2 19/10/11 15:08  1.25
## 391785 571909                 BLOND DOLL DOORSTOP        2 19/10/11 15:08  1.25
## 391922 571918         WRAP CHRISTMAS SCREEN PRINT       25 19/10/11 16:05  0.19
## 392457 571965            SILK PURSE BABUSHKA PINK        1 20/10/11 10:41  3.35
## 392560 572023       ASSORTED COLOUR BIRD ORNAMENT        8 20/10/11 11:03  1.69
## 392586 572023             20 DOLLY PEGS RETROSPOT        1 20/10/11 11:03  1.45
## 393094 572050             LUNCH BAG PINK POLKADOT        1 20/10/11 12:23  1.65
## 393153 572055    FUNKY WASHING UP GLOVES ASSORTED        1 20/10/11 12:34  2.10
## 393236 572058      COSY SLIPPER SHOES SMALL GREEN        1 20/10/11 12:43  2.95
## 393240 572058    PACK OF 20 NAPKINS PANTRY DESIGN        1 20/10/11 12:43  0.85
## 393250 572058       HAND WARMER SCOTTY DOG DESIGN        1 20/10/11 12:43  2.10
## 393266 572058     ROSE 1 WICK MORRIS BOXED CANDLE        2 20/10/11 12:43  1.25
## 393590 572073     IF YOU CAN'T STAND THE HEAT MUG        1 20/10/11 13:46  1.25
## 393616 572074          ALARM CLOCK BAKELIKE GREEN        1 20/10/11 13:54  3.75
## 393645 572074                   NINJA RABBIT PINK        2 20/10/11 13:54  1.25
## 393649 572074    TRADITIONAL WOODEN SKIPPING ROPE        2 20/10/11 13:54  1.45
## 393902 572090            CLASSIC GLASS COOKIE JAR        1 20/10/11 14:33  4.15
## 393939 572092     ROSES REGENCY TEACUP AND SAUCER        1 20/10/11 14:41  2.95
## 393941 572092    CAMPHOR WOOD PORTOBELLO MUSHROOM        6 20/10/11 14:41  1.25
## 393960 572092   MARIE ANTOINETTE TRINKET BOX GOLD        1 20/10/11 14:41 12.50
## 393963 572092      PINK REGENCY TEACUP AND SAUCER        1 20/10/11 14:41  2.95
## 393964 572092     GREEN REGENCY TEACUP AND SAUCER        1 20/10/11 14:41  2.95
## 393993 572095    EMPIRE UNION JACK TV DINNER TRAY        1 20/10/11 15:15  4.95
## 394007 572095      GAOLERS KEYS DECORATIVE GARDEN        1 20/10/11 15:15  3.75
## 394134 572103         ABSTRACT CIRCLES SKETCHBOOK        2 20/10/11 15:57  3.75
## 394147 572103           MEMO BOARD COTTAGE DESIGN        1 20/10/11 15:57  4.95
## 394154 572103                    HERB MARKER MINT        1 20/10/11 15:57  0.65
## 394155 572103                HERB MARKER ROSEMARY        1 20/10/11 15:57  0.65
## 394156 572103                   HERB MARKER THYME        1 20/10/11 15:57  0.65
## 394157 572103                   HERB MARKER BASIL        1 20/10/11 15:57  0.65
## 394158 572103                 HERB MARKER PARSLEY        1 20/10/11 15:57  0.65
## 394159 572103                  HERB MARKER CHIVES        1 20/10/11 15:57  0.65
## 394210 572103                  HERB MARKER CHIVES        1 20/10/11 15:57  0.65
## 394230 572103           MEMO BOARD COTTAGE DESIGN        1 20/10/11 15:57  4.95
## 394255 572103            GOLD EAR MUFF HEADPHONES        1 20/10/11 15:57  5.49
## 394256 572103          6 RIBBONS SHIMMERING PINKS        1 20/10/11 15:57  1.65
## 394270 572103          POPPY'S PLAYHOUSE BATHROOM        1 20/10/11 15:57  2.10
## 394281 572103      ASSTD DESIGN 3D PAPER STICKERS        1 20/10/11 15:57  0.85
## 394283 572103        3D DOG PICTURE PLAYING CARDS        1 20/10/11 15:57  2.95
## 394287 572103    PLASTERS IN TIN WOODLAND ANIMALS        1 20/10/11 15:57  1.65
## 394295 572103        SCOTTIE DOG HOT WATER BOTTLE        1 20/10/11 15:57  4.95
## 394297 572103           POPPY'S PLAYHOUSE BEDROOM        1 20/10/11 15:57  2.10
## 394298 572103           POPPY'S PLAYHOUSE KITCHEN        1 20/10/11 15:57  2.10
## 394304 572103        BAKING SET 9 PIECE RETROSPOT        1 20/10/11 15:57  4.95
## 394312 572103       HEART SHAPE WIRELESS DOORBELL        1 20/10/11 15:57  2.10
## 394314 572103       HAND WARMER SCOTTY DOG DESIGN        1 20/10/11 15:57  2.10
## 394323 572103          ASSORTED COLOUR MINI CASES        1 20/10/11 15:57  7.95
## 394324 572103        BAKING SET 9 PIECE RETROSPOT        1 20/10/11 15:57  4.95
## 394328 572103       WOODLAND BUNNIES LOLLY MAKERS        1 20/10/11 15:57  2.08
## 394330 572103      ASSTD DESIGN 3D PAPER STICKERS        1 20/10/11 15:57  0.85
## 394332 572103         MAGIC DRAWING SLATE BUNNIES        1 20/10/11 15:57  0.42
## 394793 572192   SET OF 3 WOODEN HEART DECORATIONS        1 21/10/11 11:30  1.25
## 394803 572192       DECORATIVE WICKER HEART LARGE        1 21/10/11 11:30  1.65
## 395242 572219      FRENCH KITCHEN SIGN BLUE METAL        1 21/10/11 13:17  1.25
## 395243 572219       FRENCH GARDEN SIGN BLUE METAL        1 21/10/11 13:17  1.25
## 395432 572227                  WALL ART KEEP CALM        1 21/10/11 14:01  8.25
## 395488 572229     HOT WATER BOTTLE I AM SO POORLY        8 21/10/11 14:23  4.95
## 395844 572280         12 PENCILS SMALL TUBE SKULL        1 23/10/11 11:05  0.65
## 396057 572284    WOODLAND DESIGN  COTTON TOTE BAG        2 23/10/11 12:08  2.25
## 396069 572285         FRENCH LAVENDER SCENT HEART        3 23/10/11 12:16  0.75
## 396076 572285  SET 6 SCHOOL MILK BOTTLES IN CRATE        1 23/10/11 12:16  3.75
## 396235 572291         CHRISTMAS MUSICAL ZINC TREE        3 23/10/11 12:46  0.29
## 396430 572295     3 GARDENIA MORRIS BOXED CANDLES        1 23/10/11 13:49  1.25
## 396432 572295        SPACEBOY ROCKET LOLLY MAKERS        1 23/10/11 13:49  2.08
## 396436 572295          CHILDRENS CUTLERY SPACEBOY        1 23/10/11 13:49  4.15
## 396446 572295 ASSORTED TUTTI FRUTTI  FOB NOTEBOOK       12 23/10/11 13:49  0.85
## 396482 572295         CHICK GREY HOT WATER BOTTLE        1 23/10/11 13:49  4.25
## 396502 572295         PLAYING CARDS I LOVE LONDON        1 23/10/11 13:49  1.25
## 396534 572296   GARDENERS KNEELING PAD CUP OF TEA        1 23/10/11 14:28  1.65
## 396537 572296             BLACK HEART CARD HOLDER        1 23/10/11 14:28  3.95
## 396541 572296    SET OF 4 KNICK KNACK TINS LONDON        1 23/10/11 14:28  4.15
## 396542 572296   SET OF 4 KNICK KNACK TINS POPPIES        2 23/10/11 14:28  4.15
## 396547 572296   JUMBO SHOPPER VINTAGE RED PAISLEY        1 23/10/11 14:28  2.08
## 396586 572300         VINTAGE RED ENAMEL TRIM JUG        1 23/10/11 14:40  3.75
## 396591 572300        MISTLETOE HEART WREATH CREAM        1 23/10/11 14:40  4.15
## 396597 572301                      KEY FOB , SHED        1 23/10/11 14:41  0.65
## 396668 572302                 ROBOT BIRTHDAY CARD       12 23/10/11 14:47  0.42
## 396701 572302 SET OF 2 TEA TOWELS APPLE AND PEARS        1 23/10/11 14:47  3.25
## 396703 572302      SET 2 TEA TOWELS I LOVE LONDON        1 23/10/11 14:47  3.25
## 396831 572306 ASSORTED COLOUR LIZARD SUCTION HOOK        2 23/10/11 15:11  0.42
## 396899 572307  3 HEARTS HANGING DECORATION RUSTIC        8 23/10/11 15:23  2.95
## 396900 572307   GLITTER CHRISTMAS TREE WITH BELLS       12 23/10/11 15:23  0.79
## 397018 572309              GLITTER CHRISTMAS STAR        2 23/10/11 15:29  0.39
## 397036 572309   ASSORTED SHAPES PHOTO CLIP SILVER        1 23/10/11 15:29  0.65
## 397139 572312    4 LILY  BOTANICAL DINNER CANDLES        2 23/10/11 15:47  1.25
## 397156 572312    RETROSPOT HEART HOT WATER BOTTLE        1 23/10/11 15:47  4.95
## 397158 572312         CHICK GREY HOT WATER BOTTLE        1 23/10/11 15:47  4.25
## 397164 572312        WHITE SKULL HOT WATER BOTTLE        1 23/10/11 15:47  4.25
## 397168 572312               LOVE HOT WATER BOTTLE        1 23/10/11 15:47  5.95
## 397178 572312         CHICK GREY HOT WATER BOTTLE        1 23/10/11 15:47  4.25
## 397179 572312         CHICK GREY HOT WATER BOTTLE        1 23/10/11 15:47  4.25
## 397182 572312          CHOCOLATE HOT WATER BOTTLE        1 23/10/11 15:47  4.95
## 397216 572314           CHARLOTTE BAG SUKI DESIGN       20 23/10/11 15:59  0.85
## 397330 572317           RIBBON REEL SNOWY VILLAGE        1 23/10/11 16:13  1.65
## 397355 572318    SET OF 2 CERAMIC CHRISTMAS TREES        1 23/10/11 16:19  1.45
## 397376 572318     SET OF 2 CERAMIC PAINTED HEARTS        1 23/10/11 16:19  1.45
## 397378 572318  WOOD STOCKING CHRISTMAS SCANDISPOT        1 23/10/11 16:19  0.85
## 397379 572318    SET OF 3 HANGING OWLS OLLIE BEAK        1 23/10/11 16:19  1.25
## 397383 572318  WOOD STOCKING CHRISTMAS SCANDISPOT        1 23/10/11 16:19  0.85
## 397391 572318           SET OF 6 T-LIGHTS SNOWMEN        1 23/10/11 16:19  2.95
## 397393 572318     60 CAKE CASES VINTAGE CHRISTMAS        1 23/10/11 16:19  0.55
## 397405 572318      JINGLE BELL HEART ANTIQUE GOLD        1 23/10/11 16:19  2.08
## 397411 572318            JAZZ HEARTS ADDRESS BOOK        1 23/10/11 16:19  0.19
## 397420 572318      72 SWEETHEART FAIRY CAKE CASES        1 23/10/11 16:19  0.55
## 397421 572318       TRADITIONAL CHRISTMAS RIBBONS        1 23/10/11 16:19  1.25
## 397432 572318     PACK OF 72 RETROSPOT CAKE CASES        1 23/10/11 16:19  0.55
## 397433 572318  SET OF 60 PANTRY DESIGN CAKE CASES        1 23/10/11 16:19  0.55
## 397441 572318       LARGE CERAMIC TOP STORAGE JAR        2 23/10/11 16:19  1.65
## 397629 572330      METAL SIGN,CUPCAKE SINGLE HOOK        1 24/10/11 10:17  1.25
## 397663 572330     IF YOU CAN'T STAND THE HEAT MUG        1 24/10/11 10:17  1.25
## 397664 572330                       POTTERING MUG        1 24/10/11 10:17  1.65
## 397683 572330             LUNCH BAG VINTAGE DOILY        1 24/10/11 10:17  1.65
## 397685 572330                  LUNCH BAG WOODLAND        1 24/10/11 10:17  1.65
## 397828 572344                              Manual       48 24/10/11 10:43  1.50
## 397829 572344                              Manual       48 24/10/11 10:43  1.50
## 397830 572344                              Manual       48 24/10/11 10:43  1.50
## 397831 572344                              Manual       48 24/10/11 10:43  1.50
## 397832 572344                              Manual       48 24/10/11 10:43  1.50
## 398151 572461   WOODEN PICTURE FRAME WHITE FINISH        1 24/10/11 12:56  2.95
## 398285 572475              EGG CUP MILKMAID HEIDI        2 24/10/11 13:37  1.25
## 398288 572475          RIBBON REEL STRIPES DESIGN        1 24/10/11 13:37  1.65
## 398295 572475    PACK OF 20 NAPKINS PANTRY DESIGN        1 24/10/11 13:37  0.85
## 398317 572475           CARAVAN SQUARE TISSUE BOX        1 24/10/11 13:37  0.39
## 398333 572475  SET 6 SCHOOL MILK BOTTLES IN CRATE        1 24/10/11 13:37  3.75
## 398340 572475         60 TEATIME FAIRY CAKE CASES        1 24/10/11 13:37  0.55
## 398624 572513              MINI JIGSAW DOLLY GIRL        1 24/10/11 14:36  0.42
## 398671 572513          RETRO COFFEE MUGS ASSORTED        1 24/10/11 14:36  1.65
## 398681 572513  SET OF 60 PANTRY DESIGN CAKE CASES        1 24/10/11 14:36  0.55
## 398690 572513        BEWARE OF THE CAT METAL SIGN        1 24/10/11 14:36  1.69
## 398693 572513  RED CHARLIE+LOLA PERSONAL DOORSIGN        1 24/10/11 14:36  0.39
## 398789 572519    T-LIGHT HOLDER HANGING LOVE BIRD        6 24/10/11 14:56  3.75
## 398841 572528     BAKING MOULD CHOCOLATE CUPCAKES        1 24/10/11 15:43  2.55
## 398873 572528     BAKING MOULD CHOCOLATE CUPCAKES        1 24/10/11 15:43  2.55
## 398874 572528      PACK OF 60 DINOSAUR CAKE CASES        1 24/10/11 15:43  0.55
## 398883 572528    SET 6 PAPER TABLE LANTERN HEARTS        1 24/10/11 15:43  3.75
## 398895 572528     CHILDRENS APRON SPACEBOY DESIGN        1 24/10/11 15:43  1.95
## 399674 572550      METAL SIGN,CUPCAKE SINGLE HOOK        1 24/10/11 17:06  2.46
## 400748 572650             LUNCH BAG  BLACK SKULL.        2 25/10/11 12:00  1.65
## 400750 572650              LUNCH BAG APPLE DESIGN        2 25/10/11 12:00  1.65
## 400947 572653  FELTCRAFT HAIRBAND PINK AND PURPLE        2 25/10/11 12:12  0.85
## 401104 572662          ALARM CLOCK BAKELIKE IVORY        1 25/10/11 12:54  3.75
## 401110 572662    SET OF 6 KASHMIR FOLKART BAUBLES        1 25/10/11 12:54  1.65
## 401120 572662              WOODEN BOX OF DOMINOES        2 25/10/11 12:54  1.25
## 401140 572662          FAWN BLUE HOT WATER BOTTLE        1 25/10/11 12:54  3.75
## 401220 572668            3 STRIPEY MICE FELTCRAFT        1 25/10/11 13:07  1.95
## 401229 572668        SPACEBOY ROCKET LOLLY MAKERS        1 25/10/11 13:07  2.08
## 401236 572668        SPACEBOY ROCKET LOLLY MAKERS        1 25/10/11 13:07  2.08
## 401237 572668         FELTCRAFT BOY JEAN-PAUL KIT        1 25/10/11 13:07  4.95
## 401279 572669   HEART WREATH DECORATION WITH BELL        1 25/10/11 13:10  1.25
## 401317 572669              MOODY GIRL DOOR HANGER        1 25/10/11 13:10  0.39
## 401452 572675                   APPLE BATH SPONGE        2 25/10/11 13:20  1.25
## 401517 572677                 MOTORING TISSUE BOX        1 25/10/11 13:46  0.39
## 401528 572677                   ICE CREAM BUBBLES       20 25/10/11 13:46  0.83
## 401546 572677        REX CASH+CARRY JUMBO SHOPPER        1 25/10/11 13:46  0.95
## 401818 572703              LOVE HEART TRINKET POT        2 25/10/11 14:35  0.39
## 402039 572726  NOVELTY BISCUITS CAKE STAND 3 TIER        1 25/10/11 15:19  9.95
## 402075 572726        CHILDRENS CUTLERY DOLLY GIRL        1 25/10/11 15:19  4.15
## 402123 572732                SKULLS GREETING CARD       24 25/10/11 15:21  0.42
## 402132 572732                   WRAP ENGLISH ROSE       25 25/10/11 15:21  0.42
## 402136 572732                     CARD DOLLY GIRL       12 25/10/11 15:21  0.42
## 402157 572732  SET OF 60 I LOVE LONDON CAKE CASES       24 25/10/11 15:21  0.55
## 402258 572741 ROTATING SILVER ANGELS T-LIGHT HLDR        6 25/10/11 15:47  2.55
## 403064 572834           DRAWER KNOB CERAMIC IVORY        6 26/10/11 11:46  1.45
## 403065 572834           DRAWER KNOB CERAMIC IVORY        6 26/10/11 11:46  1.45
## 403066 572834           DRAWER KNOB CERAMIC IVORY        6 26/10/11 11:46  1.45
## 403324 572858      YOU'RE CONFUSING ME METAL SIGN        2 26/10/11 12:36  1.69
## 403355 572859                 PHOTO FRAME CORNICE        1 26/10/11 12:39  2.95
## 403365 572859    CAKE STAND LOVEBIRD 2 TIER WHITE        1 26/10/11 12:39  9.95
## 403366 572859        SWEETHEART RECIPE BOOK STAND        1 26/10/11 12:39  6.75
## 403368 572859         LANDMARK FRAME NOTTING HILL        1 26/10/11 12:39 12.50
## 403370 572859          LARGE ROUND WICKER PLATTER        1 26/10/11 12:39  5.95
## 403371 572859 ROTATING SILVER ANGELS T-LIGHT HLDR        2 26/10/11 12:39  2.55
## 403372 572859        REX CASH+CARRY JUMBO SHOPPER        1 26/10/11 12:39  0.95
## 403402 572861      RED STRIPE CERAMIC DRAWER KNOB        6 26/10/11 12:46  1.45
## 403407 572861   RED DRAWER KNOB ACRYLIC EDWARDIAN       12 26/10/11 12:46  1.25
## 403408 572861 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 26/10/11 12:46  1.25
## 403409 572861 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 26/10/11 12:46  1.25
## 403412 572861 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 26/10/11 12:46  1.25
## 403413 572861 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 26/10/11 12:46  1.25
## 403414 572861 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 26/10/11 12:46  1.25
## 403416 572861     BLUE STRIPE CERAMIC DRAWER KNOB        6 26/10/11 12:46  1.45
## 403417 572861      RED STRIPE CERAMIC DRAWER KNOB        6 26/10/11 12:46  1.45
## 403418 572861      RED STRIPE CERAMIC DRAWER KNOB        6 26/10/11 12:46  1.45
## 403420 572861 WHITE SPOT BLUE CERAMIC DRAWER KNOB        6 26/10/11 12:46  1.45
## 403422 572861 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 26/10/11 12:46  1.25
## 403423 572861 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 26/10/11 12:46  1.25
## 403425 572861       BLUE SPOT CERAMIC DRAWER KNOB        6 26/10/11 12:46  1.45
## 403426 572861       BLUE SPOT CERAMIC DRAWER KNOB        6 26/10/11 12:46  1.45
## 403428 572861           DRAWER KNOB CERAMIC BLACK        6 26/10/11 12:46  1.45
## 403431 572861     BLUE STRIPE CERAMIC DRAWER KNOB        6 26/10/11 12:46  1.45
## 403432 572861     BLUE STRIPE CERAMIC DRAWER KNOB        6 26/10/11 12:46  1.45
## 403726 572880        PINK UNION JACK  LUGGAGE TAG        1 26/10/11 13:35  1.25
## 403730 572880        ABSTRACT CIRCLES POCKET BOOK        3 26/10/11 13:35  0.85
## 403742 572880          HAND WARMER RED LOVE HEART        1 26/10/11 13:35  2.10
## 403750 572880            RED RETROSPOT TISSUE BOX        1 26/10/11 13:35  0.39
## 403751 572880       CREAM SLICE FLANNEL PINK SPOT        1 26/10/11 13:35  2.95
## 403763 572880  SMALL DOLLY MIX DESIGN ORANGE BOWL        1 26/10/11 13:35  0.42
## 403764 572880        SMALL MARSHMALLOWS PINK BOWL        1 26/10/11 13:35  0.42
## 403922 572889          TRADITIONAL KNITTING NANCY        1 26/10/11 13:56  1.65
## 403940 572889           FELTCRAFT GIRL AMELIE KIT        1 26/10/11 13:56  4.95
## 404284 572905          ZINC HERB GARDEN CONTAINER        2 26/10/11 15:39  6.25
## 404415 572911      S/2 ZINC HEART DESIGN PLANTERS        1 26/10/11 16:03  9.95
## 404525 572913         VINTAGE UNION JACK DOORSTOP        1 26/10/11 16:21  5.95
## 404545 572913   LOVEBIRD HANGING DECORATION WHITE        2 26/10/11 16:21  0.85
## 404718 572922               RED DAISY POCKET BOOK        3 26/10/11 17:00  0.85
## 405381 573029          SET OF 10 LED DOLLY LIGHTS        1 27/10/11 13:33  6.25
## 405383 573029  CHARLIE+LOLA PINK HOT WATER BOTTLE        1 27/10/11 13:33  2.95
## 405404 573029         60 TEATIME FAIRY CAKE CASES        1 27/10/11 13:33  0.55
## 405551 573038        PINK UNION JACK  LUGGAGE TAG        1 27/10/11 13:48  1.25
## 405555 573038      SET 36 COLOURING PENCILS DOILY        1 27/10/11 13:48  1.25
## 405609 573038            MIRRORED WALL ART LADIES        1 27/10/11 13:48  0.75
## 405756 573075      PINK PAISLEY SQUARE TISSUE BOX        1 27/10/11 14:04  0.39
## 405933 573083 SET OF 20 VINTAGE CHRISTMAS NAPKINS        2 27/10/11 14:22  0.85
## 405967 573093       6 GIFT TAGS VINTAGE CHRISTMAS        1 27/10/11 14:38  0.83
## 405968 573093          6 GIFT TAGS 50'S CHRISTMAS        1 27/10/11 14:38  0.83
## 406040 573094       PLASTERS IN TIN CIRCUS PARADE        2 27/10/11 14:39  1.65
## 406042 573094                HOT BATHS METAL SIGN        1 27/10/11 14:39  2.10
## 406317 573122      SET 12 COLOUR PENCILS SPACEBOY        1 27/10/11 16:23  0.65
## 406840 573139             PENS ASSORTED SPACEBALL       36 27/10/11 17:29  0.19
## 406841 573139            PENS ASSORTED FUNNY FACE       36 27/10/11 17:29  0.19
## 406845 573139 BUNDLE OF 3 ALPHABET EXERCISE BOOKS        1 27/10/11 17:29  1.65
## 406877 573142    RED FLOCK LOVE HEART PHOTO FRAME       24 27/10/11 17:48  0.39
## 406920 573144 SET/5 RED RETROSPOT LID GLASS BOWLS        1 27/10/11 17:57  2.95
## 407006 573150    SET OF 3 WOODEN TREE DECORATIONS        1 27/10/11 20:07  1.25
## 407007 573150    SET OF 3 WOODEN TREE DECORATIONS        1 27/10/11 20:07  1.25
## 407034 573151 SET OF 20 VINTAGE CHRISTMAS NAPKINS        1 27/10/11 20:09  0.85
## 407071 573151          ROUND CAKE TIN VINTAGE RED        1 27/10/11 20:09  7.95
## 407106 573151         12 PENCILS SMALL TUBE SKULL        4 27/10/11 20:09  0.65
## 407121 573151       DAIRY MAID TRADITIONAL TEAPOT        1 27/10/11 20:09  6.95
## 407122 573151       12 PENCIL SMALL TUBE WOODLAND        4 27/10/11 20:09  0.65
## 407123 573151 12 PENCILS SMALL TUBE RED RETROSPOT        4 27/10/11 20:09  0.65
## 407125 573151      SET 12 COLOURING PENCILS DOILY        4 27/10/11 20:09  0.65
## 407126 573151      SET 12 COLOUR PENCILS SPACEBOY        4 27/10/11 20:09  0.65
## 407173 573152                   CORDIAL GLASS JUG        1 27/10/11 20:16  8.25
## 407815 573264   CHILDRENS TOY COOKING UTENSIL SET        2 28/10/11 12:36  2.08
## 407953 573269   HEART WREATH DECORATION WITH BELL        1 28/10/11 13:00  1.25
## 408129 573277      ROTATING LEAVES T-LIGHT HOLDER        1 28/10/11 13:18  1.25
## 408216 573286           PLASTERS IN TIN STRONGMAN        2 28/10/11 14:38  1.65
## 408232 573286             RED VINTAGE SPOT BEAKER        4 28/10/11 14:38  0.85
## 408243 573286       LADIES & GENTLEMEN METAL SIGN        1 28/10/11 14:38  2.55
## 408255 573286  SET OF 72 RETROSPOT PAPER  DOILIES        1 28/10/11 14:38  1.45
## 408359 573290   LE JARDIN BOTANIQUE CUSHION COVER        1 28/10/11 14:51  3.75
## 408482 573300      SET/2 RED RETROSPOT TEA TOWELS        1 28/10/11 16:10  3.25
## 408489 573300         RETROSPOT CIGAR BOX MATCHES        1 28/10/11 16:10  1.25
## 408521 573300      PINK PAISLEY SQUARE TISSUE BOX        1 28/10/11 16:10  0.39
## 408542 573300     ROSE 1 WICK MORRIS BOXED CANDLE        6 28/10/11 16:10  1.25
## 408544 573300       ROSE 3 WICK MORRIS BOX CANDLE       12 28/10/11 16:10  1.25
## 408555 573300      YOU'RE CONFUSING ME METAL SIGN        1 28/10/11 16:10  1.69
## 408556 573300      METAL SIGN NEIGHBOURHOOD WITCH        1 28/10/11 16:10  2.10
## 408601 573305         LANDMARK FRAME NOTTING HILL        1 28/10/11 16:13 12.50
## 408603 573305        LANDMARK FRAME LONDON BRIDGE        1 28/10/11 16:13 12.50
## 408604 573305        LANDMARK FRAME COVENT GARDEN        1 28/10/11 16:13 12.50
## 408746 573315                  WRAP CIRCUS PARADE       25 28/10/11 17:27  0.42
## 408748 573315          POPPY'S PLAYHOUSE BATHROOM        1 28/10/11 17:27  2.10
## 408749 573315           POPPY'S PLAYHOUSE KITCHEN        1 28/10/11 17:27  2.10
## 408763 573315        BOX OF VINTAGE JIGSAW BLOCKS        1 28/10/11 17:27  5.95
## 408856 573323 3 DRAWER ANTIQUE WHITE WOOD CABINET        2 30/10/11 10:54  8.95
## 408958 573328  SET/6 TURQUOISE BUTTERFLY T-LIGHTS        1 30/10/11 11:09  2.10
## 409011 573330      SET OF 4 NAPKIN CHARMS CUTLERY        1 30/10/11 11:22  2.55
## 409012 573330      CHRISTMAS TREE STAR DECORATION        1 30/10/11 11:22  0.42
## 409021 573330   PACK OF 12 50'S CHRISTMAS TISSUES        1 30/10/11 11:22  0.39
## 409306 573340        ADVENT CALENDAR GINGHAM SACK        1 30/10/11 11:55  5.95
## 409386 573340              WOODLAND CHARLOTTE BAG        2 30/10/11 11:55  0.85
## 409555 573344    TRADITIONAL WOODEN SKIPPING ROPE        1 30/10/11 12:07  1.45
## 409562 573344                      POPCORN HOLDER        4 30/10/11 12:07  0.85
## 409656 573346    SET OF 6 SNACK LOAF BAKING CASES        1 30/10/11 12:18  0.83
## 409665 573346        REX CASH+CARRY JUMBO SHOPPER        1 30/10/11 12:18  0.95
## 409682 573346        REX CASH+CARRY JUMBO SHOPPER        1 30/10/11 12:18  0.95
## 409696 573347 WHITE SPOT BLUE CERAMIC DRAWER KNOB        1 30/10/11 12:26  1.45
## 409748 573347 SET/5 RED RETROSPOT LID GLASS BOWLS        1 30/10/11 12:26  2.95
## 409996 573359  PINK/WHITE "KEEP CLEAN" BULLET BIN        1 30/10/11 12:48  2.95
## 410033 573360              WALL ART VINTAGE HEART        1 30/10/11 12:51  4.95
## 410063 573361              MOODY BOY  DOOR HANGER        1 30/10/11 12:53  0.39
## 410065 573361              MOODY GIRL DOOR HANGER        1 30/10/11 12:53  0.39
## 410079 573361              PARTY INVITES SPACEMAN        1 30/10/11 12:53  0.85
## 410326 573368        COFFEE MUG DOG + BALL DESIGN        6 30/10/11 13:18  2.55
## 410341 573369   SET OF 60 VINTAGE LEAF CAKE CASES        1 30/10/11 13:19  0.55
## 410363 573369  PACK OF 60 PINK PAISLEY CAKE CASES        1 30/10/11 13:19  0.55
## 410365 573369   SET OF 60 VINTAGE LEAF CAKE CASES        1 30/10/11 13:19  0.55
## 410432 573373        JINGLE BELL HEART DECORATION        1 30/10/11 13:37  1.65
## 410436 573373        JINGLE BELL HEART DECORATION        1 30/10/11 13:37  1.65
## 410439 573373        JINGLE BELL HEART DECORATION        1 30/10/11 13:37  1.65
## 410451 573373              MONSTERS STENCIL CRAFT        1 30/10/11 13:37  1.25
## 410460 573373         60 TEATIME FAIRY CAKE CASES        1 30/10/11 13:37  0.55
## 410466 573373      PACK OF 60 SPACEBOY CAKE CASES        1 30/10/11 13:37  0.55
## 410486 573373              LUNCH BAG PAISLEY PARK        1 30/10/11 13:37  1.65
## 410600 573377    FUNKY WASHING UP GLOVES ASSORTED        2 30/10/11 13:51  2.10
## 410601 573377    FUNKY WASHING UP GLOVES ASSORTED        2 30/10/11 13:51  2.10
## 410702 573380       SET OF 20 KIDS COOKIE CUTTERS        1 30/10/11 14:04  2.10
## 410806 573384 3 DRAWER ANTIQUE WHITE WOOD CABINET        2 30/10/11 14:19  8.95
## 410808 573384  3 HEARTS HANGING DECORATION RUSTIC        8 30/10/11 14:19  2.95
## 410844 573385               RIBBON REEL POLKADOTS        5 30/10/11 14:21  1.65
## 410854 573385    SMALL FOLKART STAR CHRISTMAS DEC       48 30/10/11 14:21  0.19
## 411087 573396                LIPSTICK PEN FUSCHIA        1 30/10/11 15:13  0.42
## 411088 573396              LIPSTICK PEN BABY PINK        1 30/10/11 15:13  0.42
## 411125 573396   CERAMIC CAKE BOWL + HANGING CAKES        1 30/10/11 15:13  2.95
## 411126 573396 SET/5 RED RETROSPOT LID GLASS BOWLS        1 30/10/11 15:13  2.95
## 411155 573397      CHRISTMAS CRAFT TREE TOP ANGEL        1 30/10/11 15:19  2.10
## 411480 573413  CHOCOLATE 1 WICK MORRIS BOX CANDLE        1 30/10/11 16:12  1.25
## 411496 573413              MADRAS NOTEBOOK MEDIUM        1 30/10/11 16:12  0.75
## 411500 573413                BLUE PAISLEY JOURNAL        1 30/10/11 16:12  2.55
## 411506 573413      VINTAGE PAISLEY STATIONERY SET        1 30/10/11 16:12  1.25
## 411527 573413  CHOCOLATE 1 WICK MORRIS BOX CANDLE        1 30/10/11 16:12  1.25
## 411549 573414    SET OF 3 WOODEN TREE DECORATIONS        1 30/10/11 16:15  1.25
## 411566 573414              HAND WARMER UNION JACK        1 30/10/11 16:15  2.10
## 411573 573414           ASSORTED COLOUR METAL CAT        3 30/10/11 16:15  1.25
## 411655 573415         4 VANILLA BOTANICAL CANDLES        2 30/10/11 16:17  1.25
## 412048 573492       ANTIQUE ALL GLASS CANDLESTICK        2 31/10/11 11:57  2.10
## 412050 573492         COSY HOUR CIGAR BOX MATCHES        1 31/10/11 11:57  1.25
## 412271 573501 3 DRAWER ANTIQUE WHITE WOOD CABINET        2 31/10/11 12:02  8.95
## 412279 573501          SET OF 3 REGENCY CAKE TINS        1 31/10/11 12:02  4.95
## 412503 573543  WHITE HANGING HEART T-LIGHT HOLDER        2 31/10/11 13:05  2.95
## 412504 573543   IVORY SWEETHEART WIRE LETTER RACK        2 31/10/11 13:05  3.75
## 415189 573772       6 GIFT TAGS VINTAGE CHRISTMAS        5 01/11/11 10:16  0.83
## 415475 573841       ROSE 3 WICK MORRIS BOX CANDLE        1 01/11/11 11:39  1.25
## 415621 573870   PAPER CHAIN KIT VINTAGE CHRISTMAS        1 01/11/11 12:25  2.95
## 415673 573872    SET OF 3 HANGING OWLS OLLIE BEAK       12 01/11/11 12:35  1.25
## 415758 573876              PARTY INVITES WOODLAND        1 01/11/11 12:48  0.85
## 415777 573876               FOLKART CLIP ON STARS        1 01/11/11 12:48  0.39
## 415788 573876   PACK OF 6 COCKTAIL PARASOL STRAWS        1 01/11/11 12:48  0.42
## 415835 573876      PACK OF 60 DINOSAUR CAKE CASES        1 01/11/11 12:48  0.55
## 415843 573876    POCKET BAG BLUE PAISLEY RED SPOT        1 01/11/11 12:48  1.25
## 415848 573876           LUNCH BAG ALPHABET DESIGN        1 01/11/11 12:48  1.65
## 415890 573876         CHICK GREY HOT WATER BOTTLE        1 01/11/11 12:48  4.25
## 415896 573876       ENGLISH ROSE HOT WATER BOTTLE        1 01/11/11 12:48  4.25
## 416105 573897    RETROSPOT HEART HOT WATER BOTTLE        1 01/11/11 14:29  4.95
## 416141 573897   GLITTER CHRISTMAS TREE WITH BELLS       12 01/11/11 14:29  0.79
## 416168 573898              HAND WARMER OWL DESIGN        1 01/11/11 14:35  2.10
## 416261 573904                  RABBIT NIGHT LIGHT        3 01/11/11 14:54  2.08
## 416393 573904         MINI PLAYING CARDS FUN FAIR        1 01/11/11 14:54  0.42
## 416489 573909              PANTRY SCRUBBING BRUSH        1 01/11/11 15:26  1.65
## 416507 573909             20 DOLLY PEGS RETROSPOT        1 01/11/11 15:26  1.45
## 417142 574015                 PHOTO FRAME CORNICE        4 02/11/11 12:03  2.95
## 417153 574015        ANTIQUE SILVER T-LIGHT GLASS        6 02/11/11 12:03  1.25
## 417256 574025    GARDENERS KNEELING PAD KEEP CALM        1 02/11/11 12:26  1.65
## 417330 574032          RIBBON REEL MAKING SNOWMEN        5 02/11/11 12:37  1.65
## 417334 574032      RED WOOLLY HOTTIE WHITE HEART.       24 02/11/11 12:37  3.75
## 417422 574034      SET/6 PINK  BUTTERFLY T-LIGHTS        1 02/11/11 12:45  2.10
## 417526 574040        SET/4 COLOURFUL MIXING BOWLS        1 02/11/11 13:01  9.95
## 417533 574040     HOT WATER BOTTLE I AM SO POORLY        1 02/11/11 13:01  4.95
## 417534 574040 SET/5 RED RETROSPOT LID GLASS BOWLS        1 02/11/11 13:01  2.95
## 417536 574040                          PHOTO CUBE        4 02/11/11 13:01  1.65
## 417662 574046  PACK OF 60 PINK PAISLEY CAKE CASES        1 02/11/11 13:19  0.55
## 417673 574046          ASSORTED COLOUR MINI CASES        1 02/11/11 13:19  7.95
## 417751 574051       BLUE SPOT CERAMIC DRAWER KNOB       12 02/11/11 13:46  1.45
## 418024 574063 RETRO LONGBOARD IRONING BOARD COVER        1 02/11/11 14:31  1.25
## 418041 574063         4 VANILLA BOTANICAL CANDLES        1 02/11/11 14:31  1.25
## 418068 574063           NOEL GARLAND PAINTED ZINC        1 02/11/11 14:31  0.39
## 418069 574063 WOODEN HEART CHRISTMAS SCANDINAVIAN        2 02/11/11 14:31  0.29
## 418070 574063   MAGNETS PACK OF 4 HOME SWEET HOME        1 02/11/11 14:31  0.39
## 418073 574063        CANDY SPOT EGG WARMER RABBIT        1 02/11/11 14:31  0.19
## 418074 574063     DARK BIRD HOUSE TREE DECORATION        2 02/11/11 14:31  0.29
## 418083 574063  WOODEN TREE CHRISTMAS SCANDINAVIAN        3 02/11/11 14:31  0.29
## 418088 574063       MAGNETS PACK OF 4 RETRO PHOTO        1 02/11/11 14:31  0.39
## 419104 574077        TRAVEL CARD WALLET KEEP CALM        1 02/11/11 15:56  0.42
## 419129 574077         4 VANILLA BOTANICAL CANDLES        1 02/11/11 15:56  1.25
## 419157 574079           AREA PATROLLED METAL SIGN        1 02/11/11 16:19  2.10
## 419191 574080            DOLLY GIRL BABY GIFT SET        1 02/11/11 16:29 16.95
## 419760 574170      CHRISTMAS CRAFT LITTLE FRIENDS        1 03/11/11 11:43  2.10
## 419763 574170        REX CASH+CARRY JUMBO SHOPPER        2 03/11/11 11:43  0.95
## 419973 574240               HEART OF WICKER LARGE        1 03/11/11 12:45  2.95
## 420033 574249        ANTIQUE SILVER T-LIGHT GLASS        6 03/11/11 13:01  1.25
## 420174 574258           SET/4 BIRD MIRROR MAGNETS        1 03/11/11 13:50  0.29
## 420178 574258           ASSORTED TUTTI FRUTTI PEN        1 03/11/11 13:50  0.29
## 420206 574258                IVORY KITCHEN SCALES        1 03/11/11 13:50  8.50
## 420213 574258                   EMPIRE TISSUE BOX        1 03/11/11 13:50  0.39
## 420219 574258        REX CASH+CARRY JUMBO SHOPPER        1 03/11/11 13:50  0.95
## 420487 574287              GLITTER CHRISTMAS TREE        1 03/11/11 15:09  0.39
## 420499 574287              STAR DECORATION RUSTIC        1 03/11/11 15:09  0.42
## 420500 574287              GLITTER CHRISTMAS TREE        1 03/11/11 15:09  0.39
## 420527 574287         RETROSPOT CIGAR BOX MATCHES        1 03/11/11 15:09  1.25
## 420548 574289     TRAVEL CARD WALLET VINTAGE LEAF       24 03/11/11 15:16  0.42
## 420581 574290      SMALL SILVER FLOWER CANDLE POT        6 03/11/11 15:18  2.95
## 420589 574292      KNEELING MAT HOUSEWORK  DESIGN        1 03/11/11 15:27  1.65
## 420599 574292    FUNKY WASHING UP GLOVES ASSORTED        1 03/11/11 15:27  2.10
## 420600 574292    FUNKY WASHING UP GLOVES ASSORTED        1 03/11/11 15:27  2.10
## 420604 574292    GARDENERS KNEELING PAD KEEP CALM        1 03/11/11 15:27  1.65
## 420610 574292        VINTAGE UNION JACK MEMOBOARD        1 03/11/11 15:27  9.95
## 420613 574292    FUNKY WASHING UP GLOVES ASSORTED        1 03/11/11 15:27  2.10
## 420618 574292          HAND WARMER RED LOVE HEART        2 03/11/11 15:27  2.10
## 420622 574292        REX CASH+CARRY JUMBO SHOPPER        1 03/11/11 15:27  0.95
## 421211 574304        BAKING SET 9 PIECE RETROSPOT        1 03/11/11 16:30  4.95
## 421233 574304              36 PENCILS TUBE SKULLS        1 03/11/11 16:30  1.25
## 421234 574304       36 PENCILS TUBE RED RETROSPOT        1 03/11/11 16:30  1.25
## 421236 574304   CHILDRENS TOY COOKING UTENSIL SET        1 03/11/11 16:30  2.08
## 421242 574304       HOME SWEET HOME CUSHION COVER        2 03/11/11 16:30  3.75
## 421243 574304         BOX OF 6 MINI 50'S CRACKERS        1 03/11/11 16:30  2.49
## 421245 574304      SET 36 COLOURING PENCILS DOILY        1 03/11/11 16:30  1.25
## 421429 574310                 PHOTO FRAME CORNICE        4 03/11/11 16:56  2.95
## 421471 574311        WOODEN ADVENT CALENDAR CREAM        1 03/11/11 16:56 16.95
## 421629 574321             BLUE PAISLEY SKETCHBOOK        1 03/11/11 19:28  3.75
## 421630 574321   ROUND SNACK BOXES SET OF 4 SKULLS        1 03/11/11 19:28  2.95
## 422042 574340   SET OF 3 BUTTERFLY COOKIE CUTTERS        1 04/11/11 10:08  1.45
## 422189 574351   CHILDRENS TOY COOKING UTENSIL SET        1 04/11/11 10:37  2.08
## 422554 574474           PACK OF 12 STICKY BUNNIES        1 04/11/11 12:05  0.65
## 422566 574474      SNOWFLAKE PORTABLE TABLE LIGHT        1 04/11/11 12:05  2.95
## 422574 574474       LAVENDER SCENTED FABRIC HEART        5 04/11/11 12:05  1.25
## 422578 574474    SET 6 PAPER TABLE LANTERN HEARTS        1 04/11/11 12:05  3.75
## 422581 574474      SET OF 6 3D KIT CARDS FOR KIDS        2 04/11/11 12:05  0.85
## 422641 574476 SET OF 20 VINTAGE CHRISTMAS NAPKINS        1 04/11/11 12:20  0.85
## 422650 574476          SET 12 VINTAGE DOILY CHALK        1 04/11/11 12:20  0.42
## 422680 574477                   WHITE WICKER STAR        1 04/11/11 12:21  2.10
## 422755 574478     FELTCRAFT HAIRBAND RED AND BLUE        1 04/11/11 12:27  0.85
## 422781 574479        SET OF 4 PANTRY JELLY MOULDS        1 04/11/11 12:39  1.25
## 422783 574479         OFFICE MUG WARMER CHOC+BLUE        1 04/11/11 12:39  2.95
## 422834 574481    SET 12 COLOUR PENCILS DOLLY GIRL        1 04/11/11 12:45  0.65
## 422848 574481      BUFFALO BILL TREASURE BOOK BOX        1 04/11/11 12:45  2.25
## 422857 574481                 WICKER WREATH LARGE        1 04/11/11 12:45  1.95
## 422864 574481         CHRISTMAS CRAFT WHITE FAIRY        1 04/11/11 12:45  1.45
## 422867 574481            ROLL WRAP 50'S CHRISTMAS        1 04/11/11 12:45  1.25
## 422872 574481              ROLL WRAP VINTAGE SPOT        4 04/11/11 12:45  1.25
## 422873 574481        POPPY'S PLAYHOUSE LIVINGROOM        1 04/11/11 12:45  2.10
## 422874 574481           POPPY'S PLAYHOUSE KITCHEN        1 04/11/11 12:45  2.10
## 422875 574481           POPPY'S PLAYHOUSE BEDROOM        1 04/11/11 12:45  2.10
## 422891 574481         SET OF 4 POLKADOT PLACEMATS        1 04/11/11 12:45  3.75
## 422892 574481          SET OF 4 POLKADOT COASTERS        1 04/11/11 12:45  1.25
## 422900 574481  SET OF 60 I LOVE LONDON CAKE CASES        1 04/11/11 12:45  0.55
## 422903 574481  SMALL DOLLY MIX DESIGN ORANGE BOWL        1 04/11/11 12:45  0.42
## 422914 574481       MINI PLAYING CARDS DOLLY GIRL        1 04/11/11 12:45  0.42
## 422919 574481                  RABBIT NIGHT LIGHT        1 04/11/11 12:45  2.08
## 422920 574481   STRAWBERRY LUNCH BOX WITH CUTLERY        1 04/11/11 12:45  2.55
## 422924 574481   ROUND SNACK BOXES SET OF 4 FRUITS        1 04/11/11 12:45  2.95
## 422926 574481   ROUND SNACK BOXES SET OF 4 FRUITS        1 04/11/11 12:45  2.95
## 422928 574481 BUNDLE OF 3 ALPHABET EXERCISE BOOKS        1 04/11/11 12:45  1.65
## 422932 574481        SKULL LUNCH BOX WITH CUTLERY        1 04/11/11 12:45  2.55
## 422933 574481                  RABBIT NIGHT LIGHT        1 04/11/11 12:45  2.08
## 422936 574481        MODERN FLORAL STATIONERY SET        1 04/11/11 12:45  1.25
## 422944 574481        BASKET OF FLOWERS SEWING KIT        1 04/11/11 12:45  0.85
## 422950 574481                  RABBIT NIGHT LIGHT        1 04/11/11 12:45  2.08
## 422955 574481                  RABBIT NIGHT LIGHT        1 04/11/11 12:45  2.08
## 422957 574481              ROLL WRAP VINTAGE SPOT        4 04/11/11 12:45  1.25
## 423000 574481                  JUMBO BAG ALPHABET        1 04/11/11 12:45  2.08
## 423150 574502        TREASURE TIN GYMKHANA DESIGN        1 04/11/11 13:16  2.08
## 423151 574502           TREASURE TIN BUFFALO BILL        1 04/11/11 13:16  2.08
## 423177 574506          ANTIQUE SILVER BAUBLE LAMP        3 04/11/11 13:24 10.40
## 423353 574530   4 PINK DINNER CANDLE SILVER FLOCK        1 04/11/11 14:07  2.55
## 423610 574536        RED RETROSPOT SMALL MILK JUG        1 04/11/11 14:35  2.55
## 423611 574536        RED RETROSPOT SUGAR JAM BOWL        1 04/11/11 14:35  2.55
## 423614 574536            ALARM CLOCK BAKELIKE RED        1 04/11/11 14:35  3.75
## 423626 574536 SET 4 VALENTINE DECOUPAGE HEART BOX        2 04/11/11 14:35  2.95
## 423628 574536     PACK OF 72 RETROSPOT CAKE CASES        1 04/11/11 14:35  0.55
## 423691 574544           STORAGE TIN VINTAGE DOILY        6 04/11/11 14:49  2.89
## 423692 574544     SET OF 4 KNICK KNACK TINS DOILY        6 04/11/11 14:49  4.15
## 423708 574544 BUNDLE OF 3 ALPHABET EXERCISE BOOKS       12 04/11/11 14:49  1.65
## 423716 574544   SKETCHBOOK MAGNETIC SHOPPING LIST       12 04/11/11 14:49  1.45
## 423726 574544           RIBBON REEL SNOWY VILLAGE        5 04/11/11 14:49  1.65
## 423745 574544           SET OF 6 NATIVITY MAGNETS       12 04/11/11 14:49  2.08
## 423756 574545       HYACINTH BULB T-LIGHT CANDLES       32 04/11/11 14:54  0.42
## 423764 574545        SET OF 5 PANCAKE DAY MAGNETS       12 04/11/11 14:54  2.08
## 423766 574545        SET OF 5 PANCAKE DAY MAGNETS       12 04/11/11 14:54  2.08
## 423784 574545         PINK HAPPY BIRTHDAY BUNTING        2 04/11/11 14:54  5.45
## 423788 574545                   S/4 CACTI CANDLES        1 04/11/11 14:54  4.95
## 423792 574545                   S/4 CACTI CANDLES        1 04/11/11 14:54  4.95
## 423794 574545                   S/4 CACTI CANDLES        1 04/11/11 14:54  4.95
## 423849 574547            RED RETROSPOT CAKE STAND        1 04/11/11 15:08 10.95
## 423896 574547      SMALL PURPLE BABUSHKA NOTEBOOK        1 04/11/11 15:08  0.85
## 423898 574547             JUMBO BAG PINK POLKADOT        1 04/11/11 15:08  2.08
## 423973 574550 SET OF TEA COFFEE SUGAR TINS PANTRY        2 04/11/11 15:18  4.95
## 424001 574555       ROCKING HORSE GREEN CHRISTMAS        5 04/11/11 15:29  0.85
## 424002 574555    SET OF 3 WOODEN TREE DECORATIONS        1 04/11/11 15:29  1.25
## 424071 574559     SET OF 4 KNICK KNACK TINS DOILY        1 04/11/11 15:50  4.15
## 424077 574559           STORAGE TIN VINTAGE DOILY        1 04/11/11 15:50  2.89
## 424522 574575             WALL ART BICYCLE SAFETY        1 04/11/11 17:03  5.95
## 424538 574575  SET OF 6 RIBBONS VINTAGE CHRISTMAS        1 04/11/11 17:03  2.89
## 424645 574619    SET 12 COLOUR PENCILS DOLLY GIRL        1 06/11/11 11:18  0.65
## 424666 574619         3 ROSE MORRIS BOXED CANDLES        1 06/11/11 11:18  1.25
## 424674 574624            WALL ART ONLY ONE PERSON        6 06/11/11 11:20  4.95
## 424718 574629        TRAVEL CARD WALLET RETROSPOT        2 06/11/11 11:21  0.42
## 424728 574629                  LUNCH BAG WOODLAND        1 06/11/11 11:21  1.65
## 424740 574643             LUNCH BAG VINTAGE DOILY       10 06/11/11 11:25  1.65
## 424756 574643            JUMBO BAG 50'S CHRISTMAS       10 06/11/11 11:25  2.08
## 424883 574657            STRAWBERRY CHARLOTTE BAG        1 06/11/11 11:43  0.85
## 424894 574657       GINGERBREAD MAN COOKIE CUTTER        2 06/11/11 11:43  1.25
## 424899 574657         CLASSIC CHROME BICYCLE BELL        2 06/11/11 11:43  1.45
## 424939 574659               HEART OF WICKER LARGE        2 06/11/11 11:44  2.95
## 424974 574660          RIBBON REEL STRIPES DESIGN        1 06/11/11 11:55  1.65
## 425001 574660         SET 8 CANDLES VINTAGE DOILY        1 06/11/11 11:55  1.95
## 425012 574660                HEART T-LIGHT HOLDER        1 06/11/11 11:55  1.45
## 425019 574660      RED GINGHAM ROSE JEWELLERY BOX        2 06/11/11 11:55  1.95
## 425025 574660              MADRAS NOTEBOOK MEDIUM        1 06/11/11 11:55  0.75
## 425109 574663  WOOD 2 DRAWER CABINET WHITE FINISH        2 06/11/11 12:04  6.95
## 425123 574663 3 DRAWER ANTIQUE WHITE WOOD CABINET        2 06/11/11 12:04  8.95
## 425132 574664      JUMBO  BAG BAROQUE BLACK WHITE       10 06/11/11 12:07  2.08
## 425164 574667           ZINC FOLKART SLEIGH BELLS        6 06/11/11 12:12  1.69
## 425214 574670           VINTAGE CHRISTMAS BUNTING        1 06/11/11 12:20  4.95
## 425231 574670         BOX OF 6 MINI 50'S CRACKERS        2 06/11/11 12:20  2.49
## 425243 574670      SET 36 COLOUR PENCILS SPACEBOY        1 06/11/11 12:20  1.25
## 425483 574675     3 GARDENIA MORRIS BOXED CANDLES        1 06/11/11 12:31  1.25
## 425494 574675              JUMBO BAG PAISLEY PARK        1 06/11/11 12:31  2.08
## 425512 574675     3 GARDENIA MORRIS BOXED CANDLES        1 06/11/11 12:31  1.25
## 425514 574675           CALENDAR PAPER CUT DESIGN        1 06/11/11 12:31  2.95
## 425802 574682    ASSORTED COLOUR SUCTION CUP HOOK        1 06/11/11 12:44  0.19
## 425815 574682           STORAGE TIN VINTAGE DOILY        1 06/11/11 12:44  2.89
## 425816 574682       HEART SHAPE WIRELESS DOORBELL        1 06/11/11 12:44  2.10
## 425818 574682   SET OF 12 FAIRY CAKE BAKING CASES        1 06/11/11 12:44  0.83
## 425819 574682    AGED GLASS SILVER T-LIGHT HOLDER       12 06/11/11 12:44  0.65
## 425868 574683              RED GINGHAM TEDDY BEAR        1 06/11/11 12:50  2.95
## 425887 574683      SET OF 4 NAPKIN CHARMS CUTLERY        1 06/11/11 12:50  2.55
## 425895 574683       ROCKING HORSE GREEN CHRISTMAS        2 06/11/11 12:50  0.85
## 425903 574683           ZINC  STAR T-LIGHT HOLDER        3 06/11/11 12:50  1.25
## 425922 574683                TOAST ITS - BEST MUM        1 06/11/11 12:50  1.25
## 426000 574686     SET OF 12  VINTAGE POSTCARD SET        1 06/11/11 13:00  0.65
## 426001 574686    SET OF 3 BIRD LIGHT PINK FEATHER        1 06/11/11 13:00  0.39
## 426024 574686    SET OF 3 BIRD LIGHT PINK FEATHER        1 06/11/11 13:00  0.39
## 426366 574700                REGENCY TEAPOT ROSES        1 06/11/11 13:53  9.95
## 426367 574700                     WIRE EGG BASKET        1 06/11/11 13:53  7.85
## 426404 574700      GLASS APOTHECARY BOTTLE ELIXIR        1 06/11/11 13:53  3.95
## 426454 574701      GAOLERS KEYS DECORATIVE GARDEN        1 06/11/11 13:54  3.75
## 426458 574701              HOME SWEET HOME BOTTLE        1 06/11/11 13:54  2.08
## 426480 574701   MAGNETS PACK OF 4 HOME SWEET HOME        1 06/11/11 13:54  0.39
## 426527 574704        ANTIQUE SILVER T-LIGHT GLASS        6 06/11/11 14:02  1.25
## 426544 574704  PEARL CRYSTAL PUMPKIN T-LIGHT HLDR        6 06/11/11 14:02  1.65
## 426694 574709        TRAVEL CARD WALLET KEEP CALM       24 06/11/11 14:14  0.42
## 426706 574709  3 HEARTS HANGING DECORATION RUSTIC        8 06/11/11 14:14  2.95
## 426710 574709  3 HEARTS HANGING DECORATION RUSTIC        8 06/11/11 14:14  2.95
## 426713 574709  3 HEARTS HANGING DECORATION RUSTIC        8 06/11/11 14:14  2.95
## 426714 574709         CREAM SWEETHEART MINI CHEST        2 06/11/11 14:14 12.75
## 426739 574710               BOOM BOX SPEAKER BOYS        1 06/11/11 14:17  5.95
## 426740 574710              BOOM BOX SPEAKER GIRLS        1 06/11/11 14:17  5.95
## 426790 574710 CHRISTMAS LIGHTS 10 VINTAGE BAUBLES        1 06/11/11 14:17  4.95
## 426838 574714                CARD MOTORBIKE SANTA       12 06/11/11 14:29  0.42
## 426840 574714         4 TRADITIONAL SPINNING TOPS        1 06/11/11 14:29  1.45
## 426841 574714    TRADITIONAL WOODEN SKIPPING ROPE        1 06/11/11 14:29  1.45
## 426859 574714                SET/4 BADGES BEETLES        2 06/11/11 14:29  1.25
## 426865 574714               BLUE HARMONICA IN BOX        1 06/11/11 14:29  1.25
## 426912 574714           SCANDINAVIAN REDS RIBBONS        1 06/11/11 14:29  1.25
## 426954 574714        SPACEBOY ROCKET LOLLY MAKERS        2 06/11/11 14:29  2.08
## 426955 574714  FAIRY CAKE FLANNEL ASSORTED COLOUR        9 06/11/11 14:29  0.79
## 426969 574716     HEART DECORATION RUSTIC HANGING        1 06/11/11 14:33  0.19
## 427058 574720              HAND WARMER UNION JACK        1 06/11/11 14:39  2.10
## 427059 574720           HAND WARMER RED RETROSPOT        1 06/11/11 14:39  2.10
## 427144 574721       WOODLAND SMALL RED FELT HEART        1 06/11/11 14:43  0.83
## 427164 574721        CURIOUS IMAGES GIFT WRAP SET        1 06/11/11 14:43  0.65
## 427237 574722             RIBBON REEL LACE DESIGN        1 06/11/11 14:45  2.10
## 427263 574722   WHITE HANGING BEADS CANDLE HOLDER        1 06/11/11 14:45  5.45
## 427310 574726              PLASTERS IN TIN SKULLS        1 06/11/11 14:56  1.65
## 427511 574734               LOVE HOT WATER BOTTLE        1 06/11/11 15:20  5.95
## 427518 574734       TRADITIONAL NAUGHTS & CROSSES        1 06/11/11 15:20  1.65
## 427520 574734       TRADTIONAL ALPHABET STAMP SET        1 06/11/11 15:20  4.95
## 427539 574734                      POPCORN HOLDER        1 06/11/11 15:20  0.85
## 427544 574734       TRADITIONAL NAUGHTS & CROSSES        1 06/11/11 15:20  1.65
## 427810 574741    TRADITIONAL WOODEN SKIPPING ROPE        1 06/11/11 16:13  1.45
## 427818 574741       MINI PLAYING CARDS DOLLY GIRL        1 06/11/11 16:13  0.42
## 427820 574741     MINI PLAYING CARDS BUFFALO BILL        1 06/11/11 16:13  0.42
## 427841 574741      NATURAL HANGING QUILTED HEARTS        2 06/11/11 16:13  0.83
## 427842 574741      NATURAL HANGING QUILTED HEARTS        2 06/11/11 16:13  0.83
## 427916 574743           TREASURE TIN BUFFALO BILL        1 06/11/11 16:14  2.08
## 428002 574749         BOX OF 6 MINI 50'S CRACKERS        6  07/11/11 8:54  2.49
## 428111 574826           POPPY'S PLAYHOUSE BEDROOM        1 07/11/11 10:58  2.10
## 428140 574826  PACK OF 60 PINK PAISLEY CAKE CASES        1 07/11/11 10:58  0.55
## 428341 574839       DOORMAT KEEP CALM AND COME IN        1 07/11/11 11:40  8.25
## 428436 574840       TRADITIONAL NAUGHTS & CROSSES        1 07/11/11 11:41  1.65
## 428438 574840 SET/5 RED RETROSPOT LID GLASS BOWLS        1 07/11/11 11:41  2.95
## 428514 574852 CERAMIC BOWL WITH STRAWBERRY DESIGN        1 07/11/11 12:04  2.95
## 428516 574852       CERAMIC STRAWBERRY DESIGN MUG        1 07/11/11 12:04  1.49
## 428519 574852       GREEN GOOSE FEATHER TREE 60CM        2 07/11/11 12:04  1.95
## 428798 574863           STORAGE TIN VINTAGE DOILY        1 07/11/11 12:29  2.89
## 428890 574864                  RABBIT NIGHT LIGHT       24 07/11/11 12:29  1.79
## 428916 574866      VINTAGE PAISLEY STATIONERY SET        2 07/11/11 12:34  1.25
## 429129 574882               WALL ART BUFFALO BILL        1 07/11/11 13:45  3.75
## 429250 574892 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN       12 07/11/11 14:40  1.25
## 429254 574892             DRAWER KNOB CERAMIC RED        6 07/11/11 14:40  1.45
## 429285 574893              LUNCH BAG PAISLEY PARK        1 07/11/11 14:40  1.65
## 429329 574896    SET OF 3 HANGING OWLS OLLIE BEAK        1 07/11/11 14:51  1.25
## 429373 574898         VINTAGE DOILY JUMBO BAG RED       10 07/11/11 15:07  2.08
## 429511 574909       EMBROIDERED RIBBON REEL ROSIE        1 07/11/11 15:40  2.08
## 429515 574909         4 TRADITIONAL SPINNING TOPS        1 07/11/11 15:40  1.45
## 429525 574909        REX CASH+CARRY JUMBO SHOPPER        1 07/11/11 15:40  0.95
## 429527 574909   TRADITIONAL WOODEN CATCH CUP GAME        1 07/11/11 15:40  1.25
## 429530 574909           SET OF 6 SOLDIER SKITTLES        1 07/11/11 15:40  3.75
## 429587 574914  SET 6 SCHOOL MILK BOTTLES IN CRATE        1 07/11/11 16:16  3.75
## 430548 574959                VICTORIAN SEWING KIT        1 08/11/11 10:09  1.25
## 430554 574959           SET OF 6 NATIVITY MAGNETS        1 08/11/11 10:09  2.08
## 430579 574959      SET 2 TEA TOWELS I LOVE LONDON        1 08/11/11 10:09  3.25
## 430585 574959      SET 2 TEA TOWELS I LOVE LONDON        1 08/11/11 10:09  3.25
## 430586 574959     VINTAGE DOILY TRAVEL SEWING KIT        1 08/11/11 10:09  1.95
## 430726 574965       BALLOON PUMP WITH 10 BALLOONS        1 08/11/11 10:44  1.95
## 430732 574965       BALLOON WATER BOMB PACK OF 35        2 08/11/11 10:44  0.42
## 430743 574965     VINTAGE DOILY TRAVEL SEWING KIT        1 08/11/11 10:44  1.95
## 430744 574965               BLUE HARMONICA IN BOX        1 08/11/11 10:44  1.25
## 430749 574965         ROLL WRAP VINTAGE CHRISTMAS        1 08/11/11 10:44  1.25
## 430750 574965            ROLL WRAP 50'S CHRISTMAS        1 08/11/11 10:44  1.25
## 430864 574994      NATURAL SLATE CHALKBOARD LARGE        1 08/11/11 11:03  4.95
## 430980 575034        REX CASH+CARRY JUMBO SHOPPER        1 08/11/11 11:38  0.95
## 430982 575034        REX CASH+CARRY JUMBO SHOPPER        1 08/11/11 11:38  0.95
## 430990 575034              SPACEBOY MINI BACKPACK        1 08/11/11 11:38  4.15
## 430998 575034                  SPACEBOY LUNCH BOX        1 08/11/11 11:38  1.95
## 431002 575034           LUNCH BAG SPACEBOY DESIGN        1 08/11/11 11:38  1.65
## 431143 575041           CALENDAR PAPER CUT DESIGN        1 08/11/11 12:01  2.95
## 431164 575046      CLOTHES PEGS RETROSPOT PACK 24        1 08/11/11 12:09  1.65
## 431289 575059              WOODEN BOX OF DOMINOES        1 08/11/11 12:25  1.25
## 431408 575063                   TOY TIDY SPACEBOY        1 08/11/11 12:32  2.10
## 431456 575063            JUMBO STORAGE BAG SKULLS        1 08/11/11 12:32  2.08
## 431591 575070          HOT WATER BOTTLE KEEP CALM        1 08/11/11 12:58  4.95
## 431640 575070  PINK DRAWER KNOB ACRYLIC EDWARDIAN        4 08/11/11 12:58  1.25
## 431703 575073        CHILDRENS CUTLERY DOLLY GIRL        1 08/11/11 13:10  4.15
## 431704 575073   SET OF 3 WOODEN HEART DECORATIONS       12 08/11/11 13:10  1.25
## 431807 575075          HOT WATER BOTTLE KEEP CALM        3 08/11/11 13:19  4.95
## 431889 575083   HANGING  BUTTERFLY T-LIGHT HOLDER        6 08/11/11 13:31  1.25
## 431892 575083   HANGING  BUTTERFLY T-LIGHT HOLDER        6 08/11/11 13:31  1.25
## 431901 575085          CHOCOLATE HOT WATER BOTTLE        1 08/11/11 13:41  4.95
## 431989 575087    RED HANGING HEART T-LIGHT HOLDER        1 08/11/11 13:57  2.95
## 432001 575087      STRAWBERRY CERAMIC TRINKET POT        1 08/11/11 13:57  1.25
## 432010 575087      YOU'RE CONFUSING ME METAL SIGN        1 08/11/11 13:57  1.69
## 432012 575087  SET OF 72 RETROSPOT PAPER  DOILIES        1 08/11/11 13:57  1.45
## 432020 575087   COLOUR GLASS. STAR T-LIGHT HOLDER        1 08/11/11 13:57  3.95
## 432022 575087              WOODLAND CHARLOTTE BAG        1 08/11/11 13:57  0.85
## 432153 575117      TOILET SIGN OCCUPIED OR VACANT        1 08/11/11 14:22  0.83
## 432156 575117                  RABBIT NIGHT LIGHT        1 08/11/11 14:22  2.08
## 432158 575117                   HERB MARKER BASIL        1 08/11/11 14:22  0.65
## 432159 575117                  HERB MARKER CHIVES        1 08/11/11 14:22  0.65
## 432160 575117                    HERB MARKER MINT        1 08/11/11 14:22  0.65
## 432161 575117                 HERB MARKER PARSLEY        1 08/11/11 14:22  0.65
## 432162 575117                   HERB MARKER THYME        1 08/11/11 14:22  0.65
## 432163 575117                HERB MARKER ROSEMARY        1 08/11/11 14:22  0.65
## 432164 575117      TOILET SIGN OCCUPIED OR VACANT        1 08/11/11 14:22  0.83
## 432169 575117    TRAVEL CARD WALLET I LOVE LONDON        1 08/11/11 14:22  0.42
## 432181 575117         60 TEATIME FAIRY CAKE CASES        1 08/11/11 14:22  0.55
## 432184 575117     60 CAKE CASES VINTAGE CHRISTMAS        1 08/11/11 14:22  0.55
## 432197 575117      TOILET SIGN OCCUPIED OR VACANT        1 08/11/11 14:22  0.83
## 432199 575117               CHRISTMAS TOILET ROLL        1 08/11/11 14:22  1.25
## 432201 575117                 TEA TIME OVEN GLOVE        1 08/11/11 14:22  1.25
## 432211 575117  NATURAL SLATE RECTANGLE CHALKBOARD        1 08/11/11 14:22  1.65
## 432220 575117   SET OF 3 WOODEN HEART DECORATIONS        1 08/11/11 14:22  1.25
## 432222 575117  MINI CAKE STAND WITH HANGING CAKES        1 08/11/11 14:22  1.45
## 432223 575117      VINTAGE PAISLEY STATIONERY SET        1 08/11/11 14:22  1.25
## 432228 575117           LUNCH BAG ALPHABET DESIGN        1 08/11/11 14:22  1.65
## 432242 575117           SWALLOW SQUARE TISSUE BOX        1 08/11/11 14:22  0.39
## 432874 575152         MINI PLAYING CARDS GYMKHANA        1 08/11/11 16:12  0.42
## 432879 575152       MINI PLAYING CARDS DOLLY GIRL        1 08/11/11 16:12  0.42
## 432883 575152       12 PENCIL SMALL TUBE WOODLAND        2 08/11/11 16:12  0.65
## 434283 575211       HAND WARMER SCOTTY DOG DESIGN        2 09/11/11 10:39  2.10
## 434354 575215          VICTORIAN SEWING BOX SMALL        4 09/11/11 11:04  5.95
## 434530 575222             WALL ART BICYCLE SAFETY        1 09/11/11 11:33  5.95
## 434549 575222             20 DOLLY PEGS RETROSPOT        4 09/11/11 11:33  1.45
## 434582 575258        CRYSTAL DIAMANTE STAR BROOCH        1 09/11/11 12:00  4.95
## 434584 575258    CHRISTMAS HANGING STAR WITH BELL        6 09/11/11 12:00  0.39
## 434769 575303         SMALL WHITE HEART OF WICKER        4 09/11/11 12:34  1.65
## 434773 575303    FUNKY WASHING UP GLOVES ASSORTED        1 09/11/11 12:34  2.10
## 434776 575303        GIANT 50'S CHRISTMAS CRACKER        1 09/11/11 12:34  2.89
## 434955 575325     TRADITIONAL PICK UP STICKS GAME        1 09/11/11 13:46  1.25
## 434956 575325       TRADTIONAL ALPHABET STAMP SET        2 09/11/11 13:46  4.95
## 434973 575325        SCOTTIE DOG HOT WATER BOTTLE        2 09/11/11 13:46  4.95
## 435212 575337    FUNKY WASHING UP GLOVES ASSORTED        1 09/11/11 14:11  2.10
## 435219 575337           CALENDAR PAPER CUT DESIGN        1 09/11/11 14:11  2.95
## 435220 575337           CALENDAR IN SEASON DESIGN        1 09/11/11 14:11  2.95
## 435224 575337  SET/3 RED GINGHAM ROSE STORAGE BOX        1 09/11/11 14:11  3.75
## 435228 575337     SILVER DIAMANTE PEN IN GIFT BOX        2 09/11/11 14:11  4.95
## 435236 575337           METALIC LEAVES BAG CHARMS        1 09/11/11 14:11  2.55
## 435243 575337              MADRAS NOTEBOOK MEDIUM        1 09/11/11 14:11  0.75
## 435244 575337                DOILY THANK YOU CARD       12 09/11/11 14:11  0.42
## 435245 575337              SWALLOWS GREETING CARD       12 09/11/11 14:11  0.42
## 435258 575337        MAGAZINE RACK GEBRA ASSORTED        1 09/11/11 14:11  1.25
## 435259 575337  MAKE YOUR OWN FLOWERPOWER CARD KIT        1 09/11/11 14:11  2.95
## 435446 575368              GLITTER CHRISTMAS TREE        1 09/11/11 15:07  0.39
## 435449 575368   UNION STRIPE WITH FRINGE  HAMMOCK        1 09/11/11 15:07  7.95
## 435453 575368       HAND WARMER SCOTTY DOG DESIGN        1 09/11/11 15:07  2.10
## 435472 575368         BOX OF 6 MINI 50'S CRACKERS        4 09/11/11 15:07  2.49
## 435473 575368   LE JARDIN BOTANIQUE CUSHION COVER        1 09/11/11 15:07  3.75
## 435481 575368    CHRISTMAS HANGING TREE WITH BELL        1 09/11/11 15:07  0.39
## 435646 575476    WHITE ROCKING HORSE HAND PAINTED       48 09/11/11 16:10  1.25
## 436283 575482          PEACE WOODEN BLOCK LETTERS        1 09/11/11 16:33  6.95
## 436294 575482           OVAL WALL MIRROR DIAMANTE        1 09/11/11 16:33  9.95
## 436479 575491                HOT BATHS METAL SIGN        1 09/11/11 17:47  2.10
## 436491 575491           BISCUIT TIN VINTAGE GREEN        1 09/11/11 17:47  6.75
## 436503 575491            ALARM CLOCK BAKELIKE RED        1 09/11/11 17:47  3.75
## 436504 575491          ALARM CLOCK BAKELIKE GREEN        1 09/11/11 17:47  3.75
## 436506 575491          HOME SWEET HOME METAL SIGN        1 09/11/11 17:47  2.95
## 436577 575491              HAND WARMER UNION JACK        1 09/11/11 17:47  2.10
## 436578 575491          HAND WARMER RED LOVE HEART        1 09/11/11 17:47  2.10
## 436579 575491   FELTCRAFT PRINCESS CHARLOTTE DOLL        1 09/11/11 17:47  3.75
## 437102 575517                RECIPE BOX RETROSPOT       12 10/11/11 10:49  2.95
## 437117 575519         MINI PLAYING CARDS SPACEBOY       20 10/11/11 10:53  0.42
## 437175 575574              EIGHT PIECE SNAKE  SET        1 10/11/11 11:37  1.25
## 437241 575583   MAGIC DRAWING SLATE CIRCUS PARADE        1 10/11/11 11:55  0.42
## 437268 575583     ROSE 1 WICK MORRIS BOXED CANDLE        1 10/11/11 11:55  1.25
## 437278 575583 SWALLOW WOODEN CHRISTMAS DECORATION        1 10/11/11 11:55  0.85
## 437290 575583     ROSE 1 WICK MORRIS BOXED CANDLE        1 10/11/11 11:55  1.25
## 437296 575583 HANGING BAUBLE T-LIGHT HOLDER SMALL        1 10/11/11 11:55  2.55
## 437297 575583        MODERN FLORAL STATIONERY SET        1 10/11/11 11:55  1.25
## 437299 575583        LANDMARK FRAME LONDON BRIDGE        1 10/11/11 11:55 12.50
## 437508 575602              LUNCH BAG PAISLEY PARK        1 10/11/11 12:27  1.65
## 438177 575621               HEART OF WICKER LARGE        2 10/11/11 13:03  2.95
## 438220 575623           IVORY WICKER HEART MEDIUM        3 10/11/11 13:14  1.25
## 438221 575623    SET OF 3 HANGING OWLS OLLIE BEAK       12 10/11/11 13:14  1.25
## 438340 575631       IVORY HANGING DECORATION  EGG       24 10/11/11 13:41  0.19
## 438609 575655             SET OF 6 T-LIGHTS SANTA        1 10/11/11 14:28  2.95
## 438732 575661         ROCKING HORSE RED CHRISTMAS        3 10/11/11 14:39  0.85
## 438743 575668             LUNCH BAG VINTAGE DOILY        1 10/11/11 14:59  1.65
## 438746 575668    TRADITIONAL WOODEN SKIPPING ROPE        1 10/11/11 14:59  1.45
## 438757 575668                  VINTAGE SNAP CARDS        1 10/11/11 14:59  0.85
## 438932 575681   GARDENERS KNEELING PAD CUP OF TEA        1 10/11/11 15:32  1.65
## 438936 575681          FLORAL FOLK STATIONERY SET        1 10/11/11 15:32  1.25
## 438952 575681    FUNKY WASHING UP GLOVES ASSORTED        1 10/11/11 15:32  2.10
## 438958 575681                DOILY THANK YOU CARD       12 10/11/11 15:32  0.42
## 439170 575692            GLITTER HEART DECORATION        1 10/11/11 16:27  0.39
## 439203 575694  12 PENCILS TALL TUBE RED RETROSPOT        1 10/11/11 16:38  0.85
## 439226 575694               LOVE HOT WATER BOTTLE        1 10/11/11 16:38  5.95
## 439381 575706           JUMBO BAG SPACEBOY DESIGN        2 10/11/11 17:13  2.08
## 439628 575726               LOVE HOT WATER BOTTLE        1 10/11/11 19:12  5.95
## 439658 575726              LUNCH BAG PAISLEY PARK        1 10/11/11 19:12  1.65
## 439763 575731                   GUMBALL COAT RACK        1 10/11/11 20:01  2.55
## 439764 575731      TRIPLE HOOK ANTIQUE IVORY ROSE        1 10/11/11 20:01  3.29
## 440551 575753          TRADITIONAL KNITTING NANCY        1 11/11/11 10:41  1.65
## 440559 575753    ASSORTED MONKEY SUCTION CUP HOOK        1 11/11/11 10:41  0.42
## 440569 575753    ASSORTED MONKEY SUCTION CUP HOOK        4 11/11/11 10:41  0.42
## 440570 575753    ASSORTED MONKEY SUCTION CUP HOOK        1 11/11/11 10:41  0.42
## 440593 575753     PLASTERS IN TIN VINTAGE PAISLEY        1 11/11/11 10:41  1.65
## 440611 575754       CHILDS BREAKFAST SET SPACEBOY        1 11/11/11 10:43  9.95
## 440664 575756    FUNKY WASHING UP GLOVES ASSORTED        2 11/11/11 10:48  2.10
## 440727 575760             LUNCH BOX I LOVE LONDON        1 11/11/11 10:50  1.95
## 440739 575760         COSY HOUR CIGAR BOX MATCHES        1 11/11/11 10:50  1.25
## 440743 575760       RIBBON REEL CHRISTMAS PRESENT        1 11/11/11 10:50  1.65
## 440755 575760       ASSORTED COLOUR BIRD ORNAMENT        8 11/11/11 10:50  1.69
## 440772 575760     RED RETROSPOT OVEN GLOVE DOUBLE        1 11/11/11 10:50  2.95
## 440776 575760          RIBBON REEL STRIPES DESIGN        1 11/11/11 10:50  1.65
## 440778 575760          RIBBON REEL STRIPES DESIGN        1 11/11/11 10:50  1.65
## 440792 575760        STRAWBERRY RAFFIA FOOD COVER        1 11/11/11 10:50  3.75
## 440795 575760          RIBBON REEL STRIPES DESIGN        1 11/11/11 10:50  1.65
## 440799 575760  BAKING MOULD HEART WHITE CHOCOLATE        1 11/11/11 10:50  2.55
## 440800 575760       SET OF 20 KIDS COOKIE CUTTERS        2 11/11/11 10:50  2.10
## 440895 575767   SMALL HANGING IVORY/RED WOOD BIRD        2 11/11/11 11:11  0.42
## 440965 575837         MINI PLAYING CARDS SPACEBOY        1 11/11/11 11:37  0.42
## 440975 575837  PINK FLORAL FELTCRAFT SHOULDER BAG        1 11/11/11 11:37  3.75
## 441144 575843     CHILDRENS CUTLERY POLKADOT PINK        1 11/11/11 12:02  4.15
## 441151 575843         VINTAGE DOILY JUMBO BAG RED        1 11/11/11 12:02  2.08
## 441152 575843             JUMBO BAG VINTAGE DOILY        1 11/11/11 12:02  2.08
## 441376 575851         ROLL WRAP VINTAGE CHRISTMAS        1 11/11/11 12:13  1.25
## 441377 575851              ROLL WRAP VINTAGE SPOT        1 11/11/11 12:13  1.25
## 441398 575851         BOX OF 6 MINI 50'S CRACKERS        1 11/11/11 12:13  2.49
## 441399 575851      BOX OF 6 MINI VINTAGE CRACKERS        1 11/11/11 12:13  2.49
## 441403 575851           WOODEN OWLS LIGHT GARLAND        1 11/11/11 12:13  4.25
## 441414 575851           BLACK EAR MUFF HEADPHONES        1 11/11/11 12:13  5.49
## 441510 575854       TRADITIONAL NAUGHTS & CROSSES       12 11/11/11 12:20  1.65
## 441564 575856       PACK OF 12 DOLLY GIRL TISSUES        1 11/11/11 12:28  0.39
## 441566 575856  MULTI COLOUR SILVER T-LIGHT HOLDER       12 11/11/11 12:28  0.85
## 441590 575856   ENGLISH ROSE SMALL SCENTED FLOWER        2 11/11/11 12:28  0.85
## 441613 575856  SET OF 60 PANTRY DESIGN CAKE CASES        1 11/11/11 12:28  0.55
## 441620 575856  SET OF 60 PANTRY DESIGN CAKE CASES        1 11/11/11 12:28  0.55
## 441622 575856   PACK OF 12 50'S CHRISTMAS TISSUES        1 11/11/11 12:28  0.39
## 441635 575856              PARTY INVITES WOODLAND        1 11/11/11 12:28  0.85
## 441807 575870   GLITTER CHRISTMAS TREE WITH BELLS        6 11/11/11 12:46  0.79
## 442468 575886                TOAST ITS - BEST MUM        1 11/11/11 13:57  1.25
## 442469 575886              TOAST ITS - I LOVE YOU        1 11/11/11 13:57  1.25
## 442494 575886       CERAMIC STRAWBERRY DESIGN MUG        1 11/11/11 13:57  1.49
## 442611 575895      EMBROIDERED RIBBON REEL RACHEL        1 11/11/11 14:50  2.89
## 442622 575895     60 CAKE CASES DOLLY GIRL DESIGN        1 11/11/11 14:50  0.55
## 442642 575895       MUSICAL ZINC HEART DECORATION        1 11/11/11 14:50  0.29
## 442643 575895    SET OF 6 SNACK LOAF BAKING CASES        1 11/11/11 14:50  0.83
## 442645 575895  SET/20 RED RETROSPOT PAPER NAPKINS        1 11/11/11 14:50  0.85
## 442646 575895                     SPACEBOY BEAKER        1 11/11/11 14:50  1.25
## 442647 575895       LARGE CERAMIC TOP STORAGE JAR        1 11/11/11 14:50  1.65
## 442649 575895                   DOLLY GIRL BEAKER        1 11/11/11 14:50  1.25
## 442659 575895 ROTATING SILVER ANGELS T-LIGHT HLDR        2 11/11/11 14:50  2.55
## 442836 575904   ASSORTED TUTTI FRUTTI LARGE PURSE        1 11/11/11 15:28  2.10
## 442843 575904   ASSORTED TUTTI FRUTTI LARGE PURSE        1 11/11/11 15:28  2.10
## 443713 575930      METAL SIGN,CUPCAKE SINGLE HOOK        1 11/11/11 17:58  2.46
## 443854 575935  SET OF 60 I LOVE LONDON CAKE CASES       24 13/11/11 11:20  0.55
## 443868 575936        PACK OF 6 SMALL FRUIT STRAWS       24 13/11/11 11:21  0.42
## 444035 575943       LITTLE GREEN MONSTER SOFT TOY        1 13/11/11 11:44  2.55
## 444038 575943       LITTLE GREEN MONSTER SOFT TOY        1 13/11/11 11:44  2.55
## 444295 575950      CHRISTMAS TREE STAR DECORATION       36 13/11/11 11:53  0.42
## 444297 575950       CHRISTMAS PUDDING TRINKET POT        2 13/11/11 11:53  0.39
## 444299 575950       CHRISTMAS PUDDING TRINKET POT        2 13/11/11 11:53  0.39
## 444370 575952  MAGIC DRAWING SLATE GO TO THE FAIR        2 13/11/11 11:55  0.42
## 444478 575957       HEN PARTY CORDON BARRIER TAPE        5 13/11/11 12:19  1.25
## 444500 575957        REX CASH+CARRY JUMBO SHOPPER        1 13/11/11 12:19  0.95
## 444580 575959           THREE MINI HANGING FRAMES        2 13/11/11 12:27  4.15
## 444861 575972              DINOSAURS  WRITING SET        1 13/11/11 13:01  1.65
## 444890 575972        SET OF 5 PANCAKE DAY MAGNETS        1 13/11/11 13:01  2.08
## 444960 575977               EDWARDIAN PHOTO FRAME        2 13/11/11 13:27  6.25
## 444969 575977  4 BLUE DINNER CANDLES SILVER FLOCK        1 13/11/11 13:27  2.55
## 445123 575985   SMALL HANGING IVORY/RED WOOD BIRD        1 13/11/11 14:09  0.42
## 445126 575985   SMALL HANGING IVORY/RED WOOD BIRD        1 13/11/11 14:09  0.42
## 445127 575985     SET 12 KIDS  WHITE CHALK STICKS        1 13/11/11 14:09  0.42
## 445145 575985     RED RETROSPOT OVEN GLOVE DOUBLE        1 13/11/11 14:09  2.95
## 445148 575985      12 RED ROSE PEG PLACE SETTINGS        3 13/11/11 14:09  1.25
## 445226 575989            ALARM CLOCK BAKELIKE RED        1 13/11/11 14:20  3.75
## 445233 575989                EGG FRYING PAN IVORY        1 13/11/11 14:20  2.08
## 445241 575989           AIRLINE LOUNGE,METAL SIGN        1 13/11/11 14:20  2.10
## 445246 575989                  RABBIT NIGHT LIGHT        1 13/11/11 14:20  2.08
## 445254 575989        LANDMARK FRAME OXFORD STREET        1 13/11/11 14:20 12.50
## 445289 576014           SET OF 6 SOLDIER SKITTLES        1 13/11/11 14:29  3.75
## 445376 576045   HOT WATER BOTTLE TEA AND SYMPATHY        2 13/11/11 14:42  4.25
## 445400 576052     SET OF 36 TEATIME PAPER DOILIES        1 13/11/11 14:48  1.45
## 445488 576053    SET OF 4 KNICK KNACK TINS LONDON        1 13/11/11 14:53  4.15
## 445491 576053     60 CAKE CASES DOLLY GIRL DESIGN        2 13/11/11 14:53  0.55
## 445589 576054       PACK OF 12 DOLLY GIRL TISSUES        1 13/11/11 14:55  0.39
## 445648 576057              TEA TIME KITCHEN APRON        1 13/11/11 15:05  5.95
## 445703 576059       WELCOME  WOODEN BLOCK LETTERS        1 13/11/11 15:19  9.95
## 445795 576062   WOODEN PICTURE FRAME WHITE FINISH        6 13/11/11 15:30  2.95
## 445936 576065           PINK DOUGHNUT TRINKET POT        2 13/11/11 15:42  1.65
## 445990 576066         JUMBO BAG VINTAGE CHRISTMAS        1 13/11/11 15:44  2.08
## 446138 576071             JUMBO BAG RED RETROSPOT        1 13/11/11 16:03  2.08
## 446151 576071             LUNCH BAG PINK POLKADOT        1 13/11/11 16:03  1.65
## 446195 576071     TRADITIONAL PICK UP STICKS GAME        1 13/11/11 16:03  1.25
## 446196 576071       TRADITIONAL NAUGHTS & CROSSES        1 13/11/11 16:03  1.65
## 446328 576075   SET OF 60 VINTAGE LEAF CAKE CASES        6 13/11/11 16:16  0.55
## 446350 576076          HOT WATER BOTTLE KEEP CALM        1 13/11/11 16:18  4.95
## 446430 576076           CALENDAR PAPER CUT DESIGN        1 13/11/11 16:18  2.95
## 446444 576076           SWALLOW SQUARE TISSUE BOX        1 13/11/11 16:18  0.39
## 446447 576076            RED RETROSPOT TISSUE BOX        1 13/11/11 16:18  0.39
## 446469 576076        REX CASH+CARRY JUMBO SHOPPER        2 13/11/11 16:18  0.95
## 446481 576077               GLOW IN DARK DOLPHINS        1 13/11/11 16:22  0.21
## 446492 576077                 EGG FRYING PAN PINK        1 13/11/11 16:22  2.08
## 447062 576176              LOVE HEART TRINKET POT        2 14/11/11 11:04  0.39
## 447123 576181             WALL ART BICYCLE SAFETY        2 14/11/11 11:19  5.95
## 447146 576181              ELEPHANT BIRTHDAY CARD       12 14/11/11 11:19  0.42
## 447389 576201            PAPER BUNTING WHITE LACE        3 14/11/11 12:18  2.95
## 447467 576212      BUFFALO BILL TREASURE BOOK BOX        1 14/11/11 12:45  2.25
## 447479 576212           ZINC FOLKART SLEIGH BELLS        6 14/11/11 12:45  1.69
## 447481 576212           ZINC FOLKART SLEIGH BELLS        6 14/11/11 12:45  1.69
## 447522 576213 PACK OF 12 VINTAGE CHRISTMAS TISSUE       12 14/11/11 12:47  0.39
## 447528 576213      PINK PAISLEY SQUARE TISSUE BOX        1 14/11/11 12:47  0.39
## 447610 576217       SILVER BELLS TABLE DECORATION        1 14/11/11 12:56  1.25
## 447697 576228  SILVER MUG BONE CHINA TREE OF LIFE        6 14/11/11 13:12  1.06
## 447734 576228     TRADITIONAL PICK UP STICKS GAME        1 14/11/11 13:12  1.25
## 447738 576228       CHRISTMAS PUDDING TRINKET POT        2 14/11/11 13:12  0.39
## 447777 576236                  RABBIT NIGHT LIGHT        1 14/11/11 13:31  2.08
## 447788 576236          FAWN BLUE HOT WATER BOTTLE        1 14/11/11 13:31  3.75
## 447790 576236               LUNCH BAG SUKI DESIGN        2 14/11/11 13:31  1.65
## 447804 576236          ACRYLIC HANGING JEWEL,BLUE        1 14/11/11 13:31  0.38
## 447812 576236               GUMBALL MAGAZINE RACK        1 14/11/11 13:31  7.65
## 447813 576236          ACRYLIC HANGING JEWEL,BLUE        1 14/11/11 13:31  0.38
## 447875 576246              CARD CHRISTMAS VILLAGE       12 14/11/11 13:42  0.42
## 447895 576246        GLASS JAR DIGESTIVE BISCUITS        1 14/11/11 13:42  2.95
## 447896 576246     GLASS JAR ENGLISH CONFECTIONERY        1 14/11/11 13:42  2.95
## 447905 576246                 MINT KITCHEN SCALES        1 14/11/11 13:42  8.50
## 447925 576249                      JUMBO BAG OWLS        2 14/11/11 13:47  2.08
## 447947 576249        BUNDLE OF 3 RETRO NOTE BOOKS        1 14/11/11 13:47  1.65
## 447962 576249      PACK OF 60 DINOSAUR CAKE CASES        1 14/11/11 13:47  0.55
## 447976 576249      MINI LIGHTS WOODLAND MUSHROOMS        1 14/11/11 13:47  3.75
## 447977 576249               CHRISTMAS TOILET ROLL        1 14/11/11 13:47  1.25
## 447993 576249       LUNCH BAG VINTAGE LEAF DESIGN        1 14/11/11 13:47  1.65
## 447996 576249          ALARM CLOCK BAKELIKE GREEN        1 14/11/11 13:47  3.75
## 448170 576255 CHRISTMAS TABLE SILVER CANDLE SPIKE        3 14/11/11 14:09  0.83
## 448252 576274        JINGLE BELL HEART DECORATION        1 14/11/11 14:24  1.65
## 448256 576274      SET 36 COLOURING PENCILS DOILY        1 14/11/11 14:24  1.25
## 448264 576274        JINGLE BELL HEART DECORATION        1 14/11/11 14:24  1.65
## 448271 576274               SWEETHEART BIRD HOUSE        1 14/11/11 14:24  4.15
## 448272 576274                   RATTLE SNAKE EGGS        1 14/11/11 14:24  1.25
## 448279 576274            REGENCY CAKESTAND 3 TIER        1 14/11/11 14:24 12.75
## 448303 576300    VINTAGE KEEPSAKE BOX PINK FLOWER        1 14/11/11 14:39  6.35
## 448325 576300    SET 12 COLOUR PENCILS DOLLY GIRL        1 14/11/11 14:39  0.65
## 448343 576300       RED TOADSTOOL LED NIGHT LIGHT        1 14/11/11 14:39  1.65
## 448352 576300              PANTRY SCRUBBING BRUSH        1 14/11/11 14:39  1.65
## 448355 576300          FLORAL FOLK STATIONERY SET        1 14/11/11 14:39  1.25
## 448382 576303     S/4 PINK FLOWER CANDLES IN BOWL        1 14/11/11 14:51  1.65
## 448429 576303 SET OF 2 TEA TOWELS APPLE AND PEARS        1 14/11/11 14:51  3.25
## 448503 576321           THREE MINI HANGING FRAMES        1 14/11/11 14:59  4.15
## 448576 576326         GIN + TONIC DIET METAL SIGN        1 14/11/11 15:18  2.55
## 448632 576326        T-LIGHT GLASS FLUTED ANTIQUE       12 14/11/11 15:18  1.25
## 448647 576326        REX CASH+CARRY JUMBO SHOPPER        1 14/11/11 15:18  0.95
## 449972 576364               KEY FOB , FRONT  DOOR        1 14/11/11 17:40  0.65
## 450639 576463      CHRISTMAS CRAFT LITTLE FRIENDS        2 15/11/11 11:37  2.10
## 450645 576463                      POPCORN HOLDER        3 15/11/11 11:37  0.85
## 450646 576463                 TOOTHPASTE TUBE PEN        1 15/11/11 11:37  0.65
## 450648 576463 PACK OF 6 SANDCASTLE FLAGS ASSORTED        1 15/11/11 11:37  0.85
## 450652 576463             JUMBO BAG VINTAGE DOILY        1 15/11/11 11:37  2.08
## 450654 576463             BLUE PAISLEY TISSUE BOX        1 15/11/11 11:37  0.39
## 450655 576463        SET OF 5 PANCAKE DAY MAGNETS        1 15/11/11 11:37  2.08
## 450657 576463      CHRISTMAS CRAFT LITTLE FRIENDS        2 15/11/11 11:37  2.10
## 450658 576463               HANGING HEART BONHEUR        1 15/11/11 11:37  0.85
## 450662 576463          GYMKHANA TREASURE BOOK BOX        1 15/11/11 11:37  2.25
## 450663 576463           POPPY'S PLAYHOUSE KITCHEN        1 15/11/11 11:37  2.10
## 450675 576463   ROUND SNACK BOXES SET OF 4 FRUITS        2 15/11/11 11:37  2.95
## 450868 576518         NUMBER TILE VINTAGE FONT No        2 15/11/11 12:25  2.10
## 450877 576518               VINTAGE BILLBOARD MUG        1 15/11/11 12:25  1.25
## 450901 576520  PORCELAIN T-LIGHT HOLDERS ASSORTED        2 15/11/11 12:33  1.25
## 450941 576538        LANDMARK FRAME LONDON BRIDGE        1 15/11/11 12:42 12.50
## 450943 576538        LANDMARK FRAME COVENT GARDEN        1 15/11/11 12:42 12.50
## 450944 576538         LANDMARK FRAME NOTTING HILL        1 15/11/11 12:42 12.50
## 450945 576538          LANDMARK FRAME CAMDEN TOWN        1 15/11/11 12:42 12.50
## 450946 576538        LANDMARK FRAME OXFORD STREET        1 15/11/11 12:42 12.50
## 451108 576559     GLASS JAR ENGLISH CONFECTIONERY        1 15/11/11 13:19  2.95
## 451109 576559     GLASS JAR ENGLISH CONFECTIONERY        1 15/11/11 13:19  2.95
## 451133 576559        JINGLE BELL HEART DECORATION        1 15/11/11 13:19  1.65
## 451137 576559           ZINC SWEETHEART SOAP DISH        1 15/11/11 13:19  2.49
## 451138 576559      CHRISTMAS RETROSPOT ANGEL WOOD        1 15/11/11 13:19  0.85
## 451527 576592       SET OF 4 FAIRY CAKE PLACEMATS        1 15/11/11 14:47  3.75
## 451555 576592            RETROSPOT LARGE MILK JUG        1 15/11/11 14:47  4.95
## 451579 576592       SET OF 6 HERB TINS SKETCHBOOK        1 15/11/11 14:47  3.95
## 451841 576600        STRAWBERRY FAIRY CAKE TEAPOT        1 15/11/11 15:08  4.95
## 451858 576600 COLOUR GLASS T-LIGHT HOLDER HANGING        8 15/11/11 15:08  0.65
## 451876 576600  CERAMIC STRAWBERRY CAKE MONEY BANK        4 15/11/11 15:08  1.45
## 451960 576607      PAPER CHAIN KIT 50'S CHRISTMAS        6 15/11/11 15:42  2.95
## 451965 576607           FELTCRAFT CHRISTMAS FAIRY        8 15/11/11 15:42  4.25
## 452039 576611            VINTAGE SNAKES & LADDERS        1 15/11/11 16:29  3.75
## 453409 576626   HEART WREATH DECORATION WITH BELL        1 15/11/11 17:26  1.25
## 453450 576626       SILVER BELLS TABLE DECORATION        1 15/11/11 17:26  1.25
## 453459 576626         RETROSPOT CIGAR BOX MATCHES        1 15/11/11 17:26  1.25
## 454135 576658               LOVE HOT WATER BOTTLE        1 16/11/11 11:05  5.95
## 454166 576661             JUMBO BAG VINTAGE DOILY        2 16/11/11 11:17  2.08
## 454298 576665             TRAVEL CARD WALLET SUKI        2 16/11/11 11:46  0.42
## 454313 576665     SET/6 PURPLE BUTTERFLY T-LIGHTS        1 16/11/11 11:46  2.10
## 454453 576686           CHARLOTTE BAG SUKI DESIGN        1 16/11/11 12:08  0.85
## 454462 576686       CHRISTMAS TREE HANGING SILVER        1 16/11/11 12:08  0.83
## 454468 576686       CHRISTMAS TREE HANGING SILVER        1 16/11/11 12:08  0.83
## 454516 576686        MAGIC DRAWING SLATE DINOSAUR        2 16/11/11 12:08  0.42
## 454523 576686      PAPER CHAIN KIT 50'S CHRISTMAS        2 16/11/11 12:08  2.95
## 454532 576686                FELTCRAFT DOLL ROSIE        1 16/11/11 12:08  2.95
## 454652 576688                   GUMBALL COAT RACK        6 16/11/11 12:16  2.55
## 454706 576689                     SPACE CADET RED       10 16/11/11 12:18  1.25
## 454708 576689          RIBBON REEL STRIPES DESIGN        5 16/11/11 12:18  1.65
## 454716 576689                 ROBOT BIRTHDAY CARD       12 16/11/11 12:18  0.42
## 454721 576689                  RABBIT NIGHT LIGHT        1 16/11/11 12:18  2.08
## 454748 576690          HOT WATER BOTTLE KEEP CALM        1 16/11/11 12:19  4.95
## 454769 576690            3 STRIPEY MICE FELTCRAFT        1 16/11/11 12:19  1.95
## 454770 576690         BOX OF 6 MINI 50'S CRACKERS        2 16/11/11 12:19  2.49
## 454772 576690            3 STRIPEY MICE FELTCRAFT        1 16/11/11 12:19  1.95
## 454838 576695                SLEEPING CAT ERASERS        1 16/11/11 12:25  0.21
## 454852 576695         STANDING FAIRY POLE SUPPORT        2 16/11/11 12:25  0.85
## 454859 576695          SET 12 VINTAGE DOILY CHALK        2 16/11/11 12:25  0.42
## 454861 576695    BEADED CHANDELIER T-LIGHT HOLDER        1 16/11/11 12:25  4.95
## 454869 576695              JUMBO BAG PAISLEY PARK        1 16/11/11 12:25  2.08
## 454893 576696  RED CHARLIE+LOLA PERSONAL DOORSIGN        1 16/11/11 12:26  0.39
## 454902 576696          SET OF 3 REGENCY CAKE TINS        4 16/11/11 12:26  4.95
## 454922 576696       RED TOADSTOOL LED NIGHT LIGHT        1 16/11/11 12:26  1.65
## 454962 576704                GREEN POLKADOT PLATE        1 16/11/11 12:29  1.69
## 455197 576779          PACK OF SIX LED TEA LIGHTS        6 16/11/11 13:25  2.89
## 455222 576779                RECIPE BOX RETROSPOT        1 16/11/11 13:25  2.95
## 455227 576779   MAGNETS PACK OF 4 HOME SWEET HOME        1 16/11/11 13:25  0.39
## 455230 576779    SET OF 3 CAKE TINS PANTRY DESIGN        3 16/11/11 13:25  4.95
## 455242 576779           PLASTERS IN TIN STRONGMAN        2 16/11/11 13:25  1.65
## 455261 576779        ANTIQUE SILVER T-LIGHT GLASS        6 16/11/11 13:25  1.25
## 455263 576779              SIX DRAWER OFFICE TIDY        1 16/11/11 13:25  9.95
## 455267 576779      DECORATIVE VINTAGE COFFEE  BOX        3 16/11/11 13:25  4.95
## 455278 576779       ASSORTED COLOUR BIRD ORNAMENT        8 16/11/11 13:25  1.69
## 455347 576784           ALARM CLOCK BAKELIKE PINK        2 16/11/11 13:40  3.75
## 455355 576784              MOODY GIRL DOOR HANGER        2 16/11/11 13:40  0.39
## 455361 576784    PLAYING CARDS JUBILEE UNION JACK        3 16/11/11 13:40  1.25
## 455367 576784      FAIRY TALE COTTAGE NIGHT LIGHT        1 16/11/11 13:40  1.95
## 455370 576784       RED TOADSTOOL LED NIGHT LIGHT        1 16/11/11 13:40  1.65
## 455371 576784   SET OF 60 VINTAGE LEAF CAKE CASES        3 16/11/11 13:40  0.55
## 455382 576784                HAND OPEN SHAPE GOLD        1 16/11/11 13:40  4.25
## 455521 576830     PACK OF 12 PAISLEY PARK TISSUES        1 16/11/11 14:54  0.39
## 455522 576830           OVAL  MINI PORTRAIT FRAME        4 16/11/11 14:54  1.95
## 455533 576830                FELTCRAFT DOLL ROSIE        1 16/11/11 14:54  2.95
## 455536 576830                FELTCRAFT DOLL MOLLY        1 16/11/11 14:54  2.95
## 456761 576841         SET 8 CANDLES VINTAGE DOILY        1 16/11/11 15:26  1.95
## 456764 576841    4 LILY  BOTANICAL DINNER CANDLES        1 16/11/11 15:26  1.25
## 456929 576851         LARGE WHITE HEART OF WICKER        1 16/11/11 15:41  2.95
## 456942 576851          HAND WARMER RED LOVE HEART        3 16/11/11 15:41  2.10
## 457058 576857           PACK OF 12 LONDON TISSUES        1 16/11/11 15:52  0.39
## 457077 576857        VINTAGE GLASS T-LIGHT HOLDER        1 16/11/11 15:52  0.83
## 457088 576857      DECORATIVE WICKER HEART MEDIUM        1 16/11/11 15:52  1.25
## 457092 576857           PACK OF 12 LONDON TISSUES        1 16/11/11 15:52  0.39
## 457093 576857              6 RIBBONS RUSTIC CHARM        1 16/11/11 15:52  1.95
## 457094 576857            LAVENDER TOILETTE BOTTLE        1 16/11/11 15:52  2.08
## 457095 576857       HOME SWEET HOME HANGING HEART        1 16/11/11 15:52  0.85
## 457100 576857       DECORATIVE WICKER HEART LARGE        1 16/11/11 15:52  1.65
## 457102 576857        PACK OF 6 SMALL FRUIT STRAWS        1 16/11/11 15:52  0.42
## 457295 576864     PACK OF 72 RETROSPOT CAKE CASES        1 16/11/11 16:06  0.55
## 457311 576864    SET OF 2 TINS JARDIN DE PROVENCE        1 16/11/11 16:06  4.95
## 457411 576875   JUMBO SHOPPER VINTAGE RED PAISLEY       10 16/11/11 16:32  2.08
## 457531 576889           BLUE POLKADOT LUGGAGE TAG        1 16/11/11 17:24  1.25
## 457781 576911            WRAP VINTAGE LEAF DESIGN       25 17/11/11 10:01  0.42
## 457822 576911           STORAGE TIN VINTAGE DOILY        1 17/11/11 10:01  2.89
## 457825 576911                      SPOTTY BUNTING        1 17/11/11 10:01  4.95
## 457829 576911               LUNCH BAG SUKI DESIGN        1 17/11/11 10:01  1.65
## 457830 576911         LUNCH BAG DOLLY GIRL DESIGN        1 17/11/11 10:01  1.65
## 458064 576928  PINK DRAWER KNOB ACRYLIC EDWARDIAN       12 17/11/11 11:04  1.25
## 458065 576928  PINK DRAWER KNOB ACRYLIC EDWARDIAN       12 17/11/11 11:04  1.25
## 458168 576933           CARAVAN SQUARE TISSUE BOX        1 17/11/11 11:29  0.39
## 458201 576933      SET 12 COLOUR PENCILS SPACEBOY        1 17/11/11 11:29  0.65
## 458214 576933            PACK OF 12 SKULL TISSUES        1 17/11/11 11:29  0.39
## 458231 576933      PACK OF 60 SPACEBOY CAKE CASES        1 17/11/11 11:29  0.55
## 458594 577024          DANISH ROSE DELUXE COASTER       12 17/11/11 12:47  0.85
## 458596 577024    SET 6 PAPER TABLE LANTERN HEARTS        1 17/11/11 12:47  3.75
## 458613 577024      ROTATING LEAVES T-LIGHT HOLDER        1 17/11/11 12:47  1.25
## 458616 577024     SET OF 4 ROSE BOTANICAL CANDLES        1 17/11/11 12:47  1.25
## 458830 577034     SET OF 2 CERAMIC PAINTED HEARTS        1 17/11/11 13:16  1.45
## 458836 577034 SET OF 2 CERAMIC CHRISTMAS REINDEER        1 17/11/11 13:16  1.45
## 458842 577034    SET OF 3 HANGING OWLS OLLIE BEAK        1 17/11/11 13:16  1.25
## 458844 577034          COFFEE SCENT PILLAR CANDLE        1 17/11/11 13:16  0.95
## 458863 577034              LOVE HEART TRINKET POT        8 17/11/11 13:16  0.39
## 458869 577034 CHRISTMAS STAR WISH LIST CHALKBOARD       12 17/11/11 13:16  1.25
## 458877 577034              FEATHER PEN,COAL BLACK       12 17/11/11 13:16  0.39
## 459194 577051       FILIGRIS HEART WITH BUTTERFLY        1 17/11/11 14:02  1.25
## 459198 577051   LOVEBIRD HANGING DECORATION WHITE        1 17/11/11 14:02  0.85
## 459225 577051      NATURAL HANGING QUILTED HEARTS        1 17/11/11 14:02  0.83
## 459267 577052          HOT STUFF HOT WATER BOTTLE        1 17/11/11 14:08  3.75
## 459268 577052          FAWN BLUE HOT WATER BOTTLE        1 17/11/11 14:08  3.75
## 459273 577052         ANTIQUE GLASS PEDESTAL BOWL        2 17/11/11 14:08  3.75
## 459332 577056              NAMASTE SWAGAT INCENSE        6 17/11/11 14:24  0.30
## 459334 577056              NAMASTE SWAGAT INCENSE        6 17/11/11 14:24  0.30
## 459410 577057      COSY SLIPPER SHOES SMALL GREEN        1 17/11/11 14:26  2.95
## 459413 577057              HAND WARMER UNION JACK        1 17/11/11 14:26  2.10
## 459421 577057       ALPHABET HEARTS STICKER SHEET        1 17/11/11 14:26  0.85
## 459434 577057                      SPOTTY BUNTING        1 17/11/11 14:26  4.95
## 459436 577057            SET OF 4 JAM JAR MAGNETS        1 17/11/11 14:26  2.08
## 459440 577057              HAND WARMER UNION JACK        1 17/11/11 14:26  2.10
## 459443 577057           HAND WARMER RED RETROSPOT        1 17/11/11 14:26  2.10
## 459465 577057         3 ROSE MORRIS BOXED CANDLES        1 17/11/11 14:26  1.25
## 459466 577057       GREEN METAL BOX ARMY SUPPLIES        1 17/11/11 14:26  8.25
## 459470 577057            JUMBO BAG 50'S CHRISTMAS        1 17/11/11 14:26  2.08
## 459472 577057            RED METAL BOX TOP SECRET        1 17/11/11 14:26  8.25
## 459482 577057             JUMBO BAG PINK POLKADOT        1 17/11/11 14:26  2.08
## 459483 577057            JUMBO STORAGE BAG SKULLS        1 17/11/11 14:26  2.08
## 459484 577057              JUMBO BAG PAISLEY PARK        1 17/11/11 14:26  2.08
## 459496 577057          SET/4 DAISY MIRROR MAGNETS        1 17/11/11 14:26  0.29
## 459534 577058        SCOTTIE DOG HOT WATER BOTTLE        1 17/11/11 14:29  4.95
## 459545 577058                    HEART CALCULATOR        1 17/11/11 14:29  1.25
## 459554 577058        3D DOG PICTURE PLAYING CARDS        1 17/11/11 14:29  2.95
## 459568 577058               LUNCH BAG SUKI DESIGN        1 17/11/11 14:29  1.65
## 459571 577058      METAL SIGN,CUPCAKE SINGLE HOOK        1 17/11/11 14:29  1.25
## 459591 577058        SCOTTIE DOG HOT WATER BOTTLE        1 17/11/11 14:29  4.95
## 459742 577076                           SPACE OWL        1 17/11/11 15:08  1.25
## 459754 577076                   SPACE CADET WHITE        1 17/11/11 15:08  1.25
## 459755 577076                    CANDY SPOT BUNNY        1 17/11/11 15:08  2.95
## 459757 577076        BABY MOUSE RED GINGHAM DRESS        1 17/11/11 15:08  4.25
## 460728 577106     SET 6 PAPER TABLE LANTERN STARS        1 17/11/11 17:18  3.75
## 460735 577106     CARROT CHARLIE+LOLA COASTER SET        1 17/11/11 17:18  1.25
## 461009 577128             YELLOW SHARK HELICOPTER        1 17/11/11 19:48  7.95
## 461010 577128          MAGIC DRAWING SLATE PURDEY        1 17/11/11 19:48  0.42
## 461419 577167             CIRCUS PARADE LUNCH BOX        1 18/11/11 10:41  1.95
## 461439 577167        TREASURE TIN GYMKHANA DESIGN        1 18/11/11 10:41  2.08
## 461446 577167            JOY WOODEN BLOCK LETTERS        1 18/11/11 10:41  4.95
## 461453 577167              BOOM BOX SPEAKER GIRLS        1 18/11/11 10:41  5.95
## 461623 577174      JINGLE BELL HEART ANTIQUE GOLD        1 18/11/11 10:58  2.08
## 461757 577217  SET 6 SCHOOL MILK BOTTLES IN CRATE        1 18/11/11 11:53  3.75
## 461891 577252              HAND WARMER OWL DESIGN        1 18/11/11 12:22  2.10
## 461892 577252         HAND WARMER BABUSHKA DESIGN        1 18/11/11 12:22  2.10
## 462041 577296 WHITE TALL PORCELAIN T-LIGHT HOLDER        1 18/11/11 12:47  2.55
## 462149 577297          ANGEL DECORATION 3 BUTTONS        2 18/11/11 12:48  0.42
## 462205 577300          HOT WATER BOTTLE KEEP CALM        2 18/11/11 12:53  4.95
## 462210 577300           SET/4 BIRD MIRROR MAGNETS       24 18/11/11 12:53  0.29
## 462251 577302        REX CASH+CARRY JUMBO SHOPPER        1 18/11/11 12:57  0.95
## 462252 577302                           BINGO SET        1 18/11/11 12:57  3.75
## 462255 577302        REX CASH+CARRY JUMBO SHOPPER        1 18/11/11 12:57  0.95
## 462259 577302          HOT WATER BOTTLE KEEP CALM        1 18/11/11 12:57  4.95
## 462371 577311      JUMBO BAG PINK VINTAGE PAISLEY        1 18/11/11 13:16  2.08
## 462372 577311              JUMBO BAG PAISLEY PARK        1 18/11/11 13:16  2.08
## 462545 577317              LUNCH BAG APPLE DESIGN        1 18/11/11 13:33  1.65
## 462554 577317           LUNCH BAG SPACEBOY DESIGN        1 18/11/11 13:33  1.65
## 462555 577317               LUNCH BAG SUKI DESIGN        1 18/11/11 13:33  1.65
## 462559 577317         LUNCH BAG RED VINTAGE DOILY        1 18/11/11 13:33  1.65
## 462560 577317             LUNCH BAG RED RETROSPOT        1 18/11/11 13:33  1.65
## 462577 577317       HAND WARMER SCOTTY DOG DESIGN        1 18/11/11 13:33  2.10
## 462581 577317                 PANTRY HOOK SPATULA        2 18/11/11 13:33  2.08
## 462626 577319          ANTIQUE SILVER BAUBLE LAMP        1 18/11/11 13:43 10.40
## 462636 577319  3 PIECE SPACEBOY COOKIE CUTTER SET        1 18/11/11 13:43  2.10
## 462638 577319           IVORY WICKER HEART MEDIUM        3 18/11/11 13:43  1.25
## 462639 577319            IVORY WICKER HEART LARGE        3 18/11/11 13:43  1.65
## 462647 577319  WOODEN STAR CHRISTMAS SCANDINAVIAN        1 18/11/11 13:43  0.29
## 462660 577319 CHRISTMAS STAR WISH LIST CHALKBOARD        2 18/11/11 13:43  1.25
## 462663 577319          ANTIQUE SILVER BAUBLE LAMP        1 18/11/11 13:43 10.40
## 462790 577331   GARDENERS KNEELING PAD CUP OF TEA        1 18/11/11 14:23  1.65
## 462887 577337           VINTAGE CHRISTMAS BUNTING        2 18/11/11 14:51  4.95
## 462894 577337    T-LIGHT HOLDER SILVER PETIT FOUR        1 18/11/11 14:51  1.25
## 463562 577359                HOT BATHS METAL SIGN        1 18/11/11 16:07  2.10
## 463963 577438              HAND WARMER OWL DESIGN        1 20/11/11 11:09  2.10
## 464029 577469               HANGING HEART BONHEUR        2 20/11/11 11:25  0.85
## 464095 577473    SET OF 3 CAKE TINS PANTRY DESIGN        1 20/11/11 11:28  4.95
## 464096 577473        RETROSPOT SMALL TUBE MATCHES        3 20/11/11 11:28  1.65
## 464103 577473           FANCY FONTS BIRTHDAY WRAP       25 20/11/11 11:28  0.42
## 464119 577473           SWALLOW SQUARE TISSUE BOX        2 20/11/11 11:28  0.39
## 464120 577473      PINK PAISLEY SQUARE TISSUE BOX        3 20/11/11 11:28  0.39
## 464139 577473             JUMBO BAG VINTAGE DOILY        1 20/11/11 11:28  2.08
## 464140 577473           FANCY FONTS BIRTHDAY WRAP       25 20/11/11 11:28  0.42
## 464156 577473 CAKE STAND VICTORIAN FILIGREE SMALL        1 20/11/11 11:28  4.95
## 464159 577473            SET OF 4 JAM JAR MAGNETS        1 20/11/11 11:28  2.08
## 464167 577473               JAM JAR WITH PINK LID        6 20/11/11 11:28  0.85
## 464168 577473                   WRAP PAISLEY PARK       25 20/11/11 11:28  0.42
## 464266 577480     GLASS JAR ENGLISH CONFECTIONERY        1 20/11/11 11:37  2.95
## 464288 577480            PARISIENNE CURIO CABINET        1 20/11/11 11:37  7.50
## 464345 577482            IVORY WICKER HEART LARGE        6 20/11/11 11:43  1.65
## 464346 577482           IVORY WICKER HEART MEDIUM       12 20/11/11 11:43  1.25
## 464347 577482         SMALL WHITE HEART OF WICKER        6 20/11/11 11:43  1.65
## 464348 577482    SET OF 2 CERAMIC CHRISTMAS TREES        6 20/11/11 11:43  1.45
## 464349 577482     SET OF 2 CERAMIC PAINTED HEARTS        6 20/11/11 11:43  1.45
## 464350 577482       ASSORTED COLOUR BIRD ORNAMENT        8 20/11/11 11:43  1.69
## 464351 577482        PAINTED METAL PEARS ASSORTED        8 20/11/11 11:43  1.69
## 464352 577482             LUNCH BAG  BLACK SKULL.        5 20/11/11 11:43  1.65
## 464353 577482                  LUNCH BAG WOODLAND        5 20/11/11 11:43  1.65
## 464354 577482              LUNCH BAG PAISLEY PARK        5 20/11/11 11:43  1.65
## 464355 577482       LUNCH BAG VINTAGE LEAF DESIGN        5 20/11/11 11:43  1.65
## 464356 577482           LUNCH BAG SPACEBOY DESIGN        5 20/11/11 11:43  1.65
## 464357 577482                 LUNCH BAG CARS BLUE        5 20/11/11 11:43  1.65
## 464358 577482   GARDENERS KNEELING PAD CUP OF TEA       12 20/11/11 11:43  1.65
## 464359 577482    GARDENERS KNEELING PAD KEEP CALM       12 20/11/11 11:43  1.65
## 464360 577482      KNEELING MAT HOUSEWORK  DESIGN        6 20/11/11 11:43  1.65
## 464364 577482         CHICK GREY HOT WATER BOTTLE        2 20/11/11 11:43  4.25
## 464365 577482               LOVE HOT WATER BOTTLE        2 20/11/11 11:43  5.95
## 464366 577482      RED WOOLLY HOTTIE WHITE HEART.        3 20/11/11 11:43  4.25
## 464367 577482     HOT WATER BOTTLE I AM SO POORLY        3 20/11/11 11:43  4.95
## 464368 577482          HOT WATER BOTTLE KEEP CALM        3 20/11/11 11:43  4.95
## 464369 577482 CHARLIE + LOLA RED HOT WATER BOTTLE        3 20/11/11 11:43  2.95
## 464370 577482    RETROSPOT HEART HOT WATER BOTTLE        3 20/11/11 11:43  4.95
## 464371 577482   HOT WATER BOTTLE TEA AND SYMPATHY        3 20/11/11 11:43  4.25
## 464372 577482              SPACEBOY MINI BACKPACK        2 20/11/11 11:43  4.15
## 464373 577482              WOODLAND MINI BACKPACK        2 20/11/11 11:43  4.15
## 464402 577483    3 HOOK PHOTO SHELF ANTIQUE WHITE        2 20/11/11 11:50  8.50
## 464507 577485          HAND WARMER RED LOVE HEART        1 20/11/11 11:56  2.10
## 464530 577485                      GARAGE KEY FOB        2 20/11/11 11:56  0.65
## 464533 577485      SET 36 COLOURING PENCILS DOILY        1 20/11/11 11:56  1.25
## 464604 577485           FELTCRAFT CHRISTMAS FAIRY        2 20/11/11 11:56  4.25
## 464662 577489    REINDEER HEART DECORATION SILVER        1 20/11/11 12:07  0.83
## 464683 577490      PACK OF 60 DINOSAUR CAKE CASES        2 20/11/11 12:11  0.55
## 464764 577493              LUNCH BAG APPLE DESIGN        1 20/11/11 12:13  1.65
## 464768 577493             LUNCH BAG PINK POLKADOT        3 20/11/11 12:13  1.65
## 464769 577493           LUNCH BAG SPACEBOY DESIGN        1 20/11/11 12:13  1.65
## 464826 577495          SET OF 3 REGENCY CAKE TINS        1 20/11/11 12:20  4.95
## 464830 577495        REX CASH+CARRY JUMBO SHOPPER        1 20/11/11 12:20  0.95
## 464835 577495            DOORSTOP FOOTBALL DESIGN        1 20/11/11 12:20  3.75
## 464874 577497                   PINK OWL SOFT TOY        1 20/11/11 12:22  2.95
## 465047 577503      FELTCRAFT PRINCESS OLIVIA DOLL        2 20/11/11 12:34  3.75
## 465054 577503    PINK BLUE FELT CRAFT TRINKET BOX        1 20/11/11 12:34  1.25
## 465058 577503    PLASTERS IN TIN WOODLAND ANIMALS        1 20/11/11 12:34  1.65
## 465063 577503             PINK/PURPLE RETRO RADIO        2 20/11/11 12:34  2.95
## 465064 577503             PINK/PURPLE RETRO RADIO        2 20/11/11 12:34  2.95
## 465066 577503       4 PURPLE FLOCK DINNER CANDLES        1 20/11/11 12:34  2.55
## 465081 577503     MAKE YOUR OWN PLAYTIME CARD KIT        2 20/11/11 12:34  2.95
## 465082 577503  MAKE YOUR OWN FLOWERPOWER CARD KIT        2 20/11/11 12:34  2.95
## 465084 577503        REX CASH+CARRY JUMBO SHOPPER        1 20/11/11 12:34  0.95
## 465099 577504               LUNCH BAG SUKI DESIGN        2 20/11/11 12:36  1.65
## 465113 577504              LUNCH BAG APPLE DESIGN        3 20/11/11 12:36  1.65
## 465134 577504              JUMBO BAG PAISLEY PARK        1 20/11/11 12:36  2.08
## 465153 577504      MONEY BOX CONFECTIONERY DESIGN        1 20/11/11 12:36  1.25
## 465215 577504  ROUND SNACK BOXES SET OF4 WOODLAND        1 20/11/11 12:36  2.95
## 465251 577504     PACK OF 72 RETROSPOT CAKE CASES        1 20/11/11 12:36  0.55
## 465261 577504          FLORAL FOLK STATIONERY SET        1 20/11/11 12:36  1.25
## 465272 577504    SET OF 3 CAKE TINS PANTRY DESIGN        2 20/11/11 12:36  4.95
## 465333 577506 PURPLE DRAWERKNOB ACRYLIC EDWARDIAN        1 20/11/11 12:40  1.25
## 465420 577507 BUNDLE OF 3 ALPHABET EXERCISE BOOKS        1 20/11/11 12:42  1.65
## 465422 577507              FELT EGG COSY LADYBIRD        1 20/11/11 12:42  0.85
## 465447 577507   SET OF 4 KNICK KNACK TINS POPPIES        1 20/11/11 12:42  4.15
## 465487 577508     PLASTERS IN TIN VINTAGE PAISLEY        1 20/11/11 12:45  1.65
## 465513 577511      SET OF 6 TEA TIME BAKING CASES        2 20/11/11 12:53  1.25
## 465624 577517       SET OF 5 MINI GROCERY MAGNETS        3 20/11/11 13:16  2.08
## 465705 577519   WOOD BLACK BOARD ANT WHITE FINISH        2 20/11/11 13:20  7.95
## 465804 577522        CLASSIC CAFE SUGAR DISPENSER        1 20/11/11 13:23  1.25
## 466340 577536      STRAWBERRY CERAMIC TRINKET POT        1 20/11/11 14:14  1.25
## 466408 577540          WOODEN FRAME ANTIQUE WHITE        1 20/11/11 14:28  2.95
## 466606 577545            JUMBO BAG 50'S CHRISTMAS        2 20/11/11 14:43  2.08
## 466619 577549    SQUARE FLOOR CUSHION VINTAGE RED        1 20/11/11 15:00  7.95
## 466641 577549          ANGEL DECORATION 3 BUTTONS        1 20/11/11 15:00  0.42
## 466644 577549      SILVER HEARTS TABLE DECORATION        1 20/11/11 15:00  0.83
## 466679 577549         SKULL DESIGN TV DINNER TRAY        1 20/11/11 15:00  4.95
## 466808 577557                      SANDALWOOD FAN        1 20/11/11 15:36  0.85
## 466814 577557              MADRAS NOTEBOOK MEDIUM        1 20/11/11 15:36  0.75
## 466828 577557        HANGING ENGRAVED METAL HEART        1 20/11/11 15:36  4.15
## 466835 577557       ROSE 3 WICK MORRIS BOX CANDLE        2 20/11/11 15:36  1.25
## 466966 577595                 BATHROOM METAL SIGN        1 20/11/11 16:12  0.55
## 467418 577690      SNOWFLAKE PORTABLE TABLE LIGHT        1 21/11/11 11:34  2.95
## 467551 577696 KNITTED UNION FLAG HOT WATER BOTTLE        1 21/11/11 11:57  4.25
## 467586 577696                   6 ROCKET BALLOONS        3 21/11/11 11:57  0.65
## 467587 577696       BALLOON WATER BOMB PACK OF 35        1 21/11/11 11:57  0.42
## 467593 577696           POPPY'S PLAYHOUSE KITCHEN        1 21/11/11 11:57  2.10
## 467693 577700       ASSORTED COLOUR BIRD ORNAMENT        3 21/11/11 12:06  1.69
## 467757 577711              ALPHABET STENCIL CRAFT        1 21/11/11 12:17  1.25
## 467877 577723          IVORY PAPER CUP CAKE CASES        1 21/11/11 12:36  0.55
## 467878 577723           75 GREEN FAIRY CAKE CASES        1 21/11/11 12:36  0.55
## 467940 577728               LUNCH BAG SUKI DESIGN        1 21/11/11 12:52  1.65
## 467941 577728  SET OF 6 RIBBONS VINTAGE CHRISTMAS        1 21/11/11 12:52  2.89
## 467951 577728          HOT WATER BOTTLE KEEP CALM        1 21/11/11 12:52  4.95
## 467954 577728           HAND WARMER RED RETROSPOT        1 21/11/11 12:52  2.10
## 467958 577728 SET OF 20 VINTAGE CHRISTMAS NAPKINS        1 21/11/11 12:52  0.85
## 467959 577728              TOY TIDY PINK POLKADOT        1 21/11/11 12:52  2.10
## 468098 577740           SET OF 6 HEART CHOPSTICKS        1 21/11/11 13:36  1.25
## 468128 577740        SCOTTIE DOG HOT WATER BOTTLE        1 21/11/11 13:36  4.95
## 468131 577740   SET/3 ROSE CANDLE IN JEWELLED BOX        1 21/11/11 13:36  4.25
## 468133 577740     60 CAKE CASES VINTAGE CHRISTMAS        1 21/11/11 13:36  0.55
## 468139 577740    LUNCH BOX WITH CUTLERY RETROSPOT        1 21/11/11 13:36  2.55
## 468142 577740   SKETCHBOOK MAGNETIC SHOPPING LIST        2 21/11/11 13:36  1.45
## 468189 577742               CHRISTMAS TOILET ROLL        1 21/11/11 13:41  1.25
## 468235 577742      CLOTHES PEGS RETROSPOT PACK 24        1 21/11/11 13:41  1.65
## 468443 577751       ASSORTED COLOUR BIRD ORNAMENT        8 21/11/11 14:34  1.69
## 469149 577773     MINI PLAYING CARDS BUFFALO BILL        1 21/11/11 15:57  0.42
## 469152 577773   PAPER CHAIN KIT VINTAGE CHRISTMAS        3 21/11/11 15:57  2.95
## 469162 577773               FELT EGG COSY CHICKEN        1 21/11/11 15:57  0.85
## 469166 577773             20 DOLLY PEGS RETROSPOT        3 21/11/11 15:57  1.45
## 469169 577773         ROLL WRAP VINTAGE CHRISTMAS        3 21/11/11 15:57  1.25
## 469259 577774         SET 8 CANDLES VINTAGE DOILY        3 21/11/11 15:57  1.95
## 469318 577778              HAND WARMER UNION JACK        1 21/11/11 16:10  2.10
## 469320 577778           PACK OF 12 LONDON TISSUES        1 21/11/11 16:10  0.39
## 469322 577778    RED HANGING HEART T-LIGHT HOLDER        1 21/11/11 16:10  2.95
## 469323 577778  COLOURED GLASS STAR T-LIGHT HOLDER        1 21/11/11 16:10  3.95
## 469326 577778       TRAVEL CARD WALLET UNION JACK        1 21/11/11 16:10  0.42
## 469329 577778     VICTORIAN GLASS HANGING T-LIGHT        1 21/11/11 16:10  1.95
## 469336 577778       DECORATIVE WICKER HEART LARGE        1 21/11/11 16:10  1.65
## 469354 577782       CHRISTMAS PUDDING TRINKET POT        6 21/11/11 16:17  0.39
## 469388 577782          HAND WARMER RED LOVE HEART        1 21/11/11 16:17  2.10
## 469394 577782               LUNCH BAG SUKI DESIGN        1 21/11/11 16:17  1.65
## 469401 577782                PIGGY BANK RETROSPOT        1 21/11/11 16:17  2.55
## 469411 577782      PAPER CHAIN KIT 50'S CHRISTMAS        1 21/11/11 16:17  2.95
## 469412 577782       SILVER BELLS TABLE DECORATION        1 21/11/11 16:17  1.25
## 469417 577782        SET 7 BABUSHKA NESTING BOXES        1 21/11/11 16:17  8.50
## 469420 577782      SET 36 COLOUR PENCILS SPACEBOY        1 21/11/11 16:17  1.25
## 469660 577794               CHOCOLATE BOX RIBBONS        1 21/11/11 16:48  1.25
## 469688 577795     SCANDINAVIAN PAISLEY PICNIC BAG        1 21/11/11 16:50  1.65
## 469689 577795     PINK VINTAGE PAISLEY PICNIC BAG        1 21/11/11 16:50  1.65
## 470291 577855      SET OF 9 HEART SHAPED BALLOONS        1 22/11/11 11:18  1.25
## 470300 577855              CHRISTMAS GINGHAM STAR        1 22/11/11 11:18  0.85
## 470356 577855              CHRISTMAS GINGHAM STAR        1 22/11/11 11:18  0.85
## 470484 577869   SET OF SALT AND PEPPER TOADSTOOLS        6 22/11/11 11:34  1.25
## 470571 577938   SET OF 12 FAIRY CAKE BAKING CASES        1 22/11/11 12:07  0.83
## 470576 577938   SET OF 12 FAIRY CAKE BAKING CASES        1 22/11/11 12:07  0.83
## 470579 577938  SET OF 60 PANTRY DESIGN CAKE CASES        2 22/11/11 12:07  0.55
## 470581 577938   PACK OF 12 50'S CHRISTMAS TISSUES        2 22/11/11 12:07  0.39
## 470881 578016        FELTCRAFT PRINCESS LOLA DOLL        1 22/11/11 13:02  3.75
## 470884 578016        FELTCRAFT PRINCESS LOLA DOLL        1 22/11/11 13:02  3.75
## 470886 578016                FELTCRAFT DOLL ROSIE        1 22/11/11 13:02  2.95
## 470893 578016             RIBBON REEL LACE DESIGN        5 22/11/11 13:02  2.10
## 470959 578017            BLACK RECORD COVER FRAME        2 22/11/11 13:07  3.75
## 470969 578017        RETROSPOT GIANT TUBE MATCHES        1 22/11/11 13:07  2.55
## 470979 578017            BLACK RECORD COVER FRAME        2 22/11/11 13:07  3.75
## 470984 578017                 DOORMAT NEW ENGLAND        1 22/11/11 13:07  8.25
## 470988 578017       SILVER STARS TABLE DECORATION        1 22/11/11 13:07  0.83
## 471047 578019     KEY RING BASEBALL BOOT ASSORTED        1 22/11/11 13:11  1.25
## 471048 578019     KEY RING BASEBALL BOOT ASSORTED        1 22/11/11 13:11  1.25
## 471049 578019     KEY RING BASEBALL BOOT ASSORTED        1 22/11/11 13:11  1.25
## 471054 578019          ALARM CLOCK BAKELIKE GREEN        1 22/11/11 13:11  3.75
## 471578 578041        BLACK/BLUE POLKADOT UMBRELLA        1 22/11/11 14:23  5.95
## 471629 578041          HAND WARMER RED LOVE HEART        2 22/11/11 14:23  2.10
## 471641 578041      ASSORTED COLOUR T-LIGHT HOLDER       12 22/11/11 14:23  0.65
## 471648 578041 4 IVORY DINNER CANDLES SILVER FLOCK        1 22/11/11 14:23  2.55
## 471651 578041 4 IVORY DINNER CANDLES SILVER FLOCK        1 22/11/11 14:23  2.55
## 471659 578041          ALARM CLOCK BAKELIKE GREEN        1 22/11/11 14:23  3.75
## 471663 578041          ALARM CLOCK BAKELIKE GREEN        1 22/11/11 14:23  3.75
## 471665 578041   WOODEN PICTURE FRAME WHITE FINISH        6 22/11/11 14:23  2.95
## 471667 578041                 PHOTO FRAME CORNICE        4 22/11/11 14:23  2.95
## 471675 578041              VINTAGE EMBOSSED HEART        6 22/11/11 14:23  1.25
## 471691 578041                  SPACEBOY LUNCH BOX        1 22/11/11 14:23  1.95
## 471707 578041                  SPACEBOY LUNCH BOX        1 22/11/11 14:23  1.95
## 471710 578041  ROUND SNACK BOXES SET OF4 WOODLAND        1 22/11/11 14:23  2.95
## 471711 578041               LONDON BUS COFFEE MUG        6 22/11/11 14:23  2.55
## 471712 578041              VINTAGE EMBOSSED HEART        6 22/11/11 14:23  1.25
## 471721 578041     60 CAKE CASES VINTAGE CHRISTMAS        1 22/11/11 14:23  0.55
## 471723 578041                DOLLY GIRL LUNCH BOX        1 22/11/11 14:23  1.95
## 471729 578041  ROUND SNACK BOXES SET OF4 WOODLAND        1 22/11/11 14:23  2.95
## 471736 578041  12 PENCILS TALL TUBE RED RETROSPOT        1 22/11/11 14:23  0.85
## 471739 578041   PACK OF 6 COCKTAIL PARASOL STRAWS        2 22/11/11 14:23  0.42
## 471740 578041  ROUND SNACK BOXES SET OF4 WOODLAND        1 22/11/11 14:23  2.95
## 471821 578045          SQUARE MINI PORTRAIT FRAME        1 22/11/11 14:43  1.95
## 471823 578045             CHILDREN'S SPACEBOY MUG        1 22/11/11 14:43  1.65
## 471908 578057       VINTAGE LEAF MAGNETIC NOTEPAD        1 22/11/11 15:05  1.45
## 472976 578068       SET OF 5 MINI GROCERY MAGNETS        1 22/11/11 15:45  2.08
## 473040 578068        SINGLE WIRE HOOK IVORY HEART        2 22/11/11 15:45  1.45
## 473050 578068         MINI PLAYING CARDS SPACEBOY        1 22/11/11 15:45  0.42
## 473055 578068         PLAYING CARDS I LOVE LONDON        1 22/11/11 15:45  1.25
## 473118 578072              PARTY CHARMS 50 PIECES        1 22/11/11 16:02  0.83
## 473119 578072   SET 20 NAPKINS FAIRY CAKES DESIGN        1 22/11/11 16:02  0.85
## 473127 578072                SET/4 BADGES BEETLES        2 22/11/11 16:02  1.25
## 473140 578072        REX CASH+CARRY JUMBO SHOPPER        1 22/11/11 16:02  0.95
## 473167 578072       SILVER HANGING T-LIGHT HOLDER        6 22/11/11 16:02  1.65
## 473215 578074                LANTERN CREAM GAZEBO        1 22/11/11 16:06  4.95
## 473219 578074     SET OF 4 ROSE BOTANICAL CANDLES        1 22/11/11 16:06  1.25
## 473245 578074               BALLOONS  WRITING SET        1 22/11/11 16:06  1.65
## 473269 578074       HOME SWEET HOME HANGING HEART        1 22/11/11 16:06  0.85
## 473282 578074              WOODEN BOX OF DOMINOES        2 22/11/11 16:06  1.25
## 473496 578088              RED GINGHAM TEDDY BEAR        1 22/11/11 16:47  2.95
## 473508 578088           THREE MINI HANGING FRAMES        1 22/11/11 16:47  4.15
## 473545 578088               MOBILE VINTAGE HEARTS        1 22/11/11 16:47  4.95
## 474060 578146   S/6 WOODEN SKITTLES IN COTTON BAG        1 23/11/11 11:07  3.25
## 474079 578146                           BINGO SET        1 23/11/11 11:07  3.75
## 474104 578147        PACK OF 6 SMALL FRUIT STRAWS        1 23/11/11 11:09  0.42
## 474115 578147      RAINBOW PEGS PHOTO CLIP STRING        1 23/11/11 11:09  0.65
## 474456 578153    CUT GLASS T-LIGHT HOLDER OCTAGON        1 23/11/11 11:22  2.55
## 474466 578153  FOLK FELT HANGING MULTICOL GARLAND        1 23/11/11 11:22  3.75
## 474470 578153                  KIDS RAIN MAC PINK        1 23/11/11 11:22  0.85
## 474492 578155       WOOD STAMP SET HAPPY BIRTHDAY        1 23/11/11 11:32  0.83
## 474500 578155       HAND WARMER SCOTTY DOG DESIGN        1 23/11/11 11:32  2.10
## 474506 578155          HAND WARMER RED LOVE HEART        1 23/11/11 11:32  2.10
## 474515 578155          PACK OF SIX LED TEA LIGHTS        1 23/11/11 11:32  2.89
## 474532 578155           FELTCRAFT CHRISTMAS FAIRY        1 23/11/11 11:32  4.25
## 474628 578211       WOOD STAMP SET HAPPY BIRTHDAY        1 23/11/11 11:47  0.83
## 474637 578211     PINK UNION JACK  PASSPORT COVER        1 23/11/11 11:47  2.10
## 474848 578233                 LUNCH BAG CARS BLUE       10 23/11/11 12:20  1.65
## 474855 578233           LUNCH BAG SPACEBOY DESIGN       10 23/11/11 12:20  1.65
## 474865 578233         WALL ART ANIMALS AND NATURE        1 23/11/11 12:20  3.75
## 474900 578233   BLUE SCOTTIE DOG W FLOWER PATTERN        2 23/11/11 12:20  2.55
## 474903 578233   PINK SCOTTIE DOG W FLOWER PATTERN        2 23/11/11 12:20  2.55
## 474954 578233     3 RAFFIA RIBBONS 50'S CHRISTMAS       10 23/11/11 12:20  0.79
## 474959 578233              WOODEN BOX OF DOMINOES        6 23/11/11 12:20  1.25
## 475154 578250  SET OF 3 WOODEN SLEIGH DECORATIONS        1 23/11/11 12:43  1.25
## 475158 578250 SET OF 3 WOODEN STOCKING DECORATION        1 23/11/11 12:43  1.25
## 475161 578250        BAKING SET 9 PIECE RETROSPOT        1 23/11/11 12:43  4.95
## 475165 578250  SET OF 60 PANTRY DESIGN CAKE CASES        1 23/11/11 12:43  0.55
## 475220 578251         VINTAGE CHRISTMAS GIFT SACK        1 23/11/11 12:45  4.15
## 475282 578255  WHITE HANGING HEART T-LIGHT HOLDER        1 23/11/11 12:58  2.95
## 475305 578255        PACK OF 6 SMALL FRUIT STRAWS        1 23/11/11 12:58  0.42
## 475312 578255  SET/4 RED MINI ROSE CANDLE IN BOWL        1 23/11/11 12:58  1.65
## 475324 578255        PACK OF 6 SMALL FRUIT STRAWS        1 23/11/11 12:58  0.42
## 475344 578255             PAPER BUNTING RETROSPOT        1 23/11/11 12:58  2.95
## 475474 578262               LUNCH BAG SUKI DESIGN        1 23/11/11 13:27  1.65
## 475512 578262         60 TEATIME FAIRY CAKE CASES        2 23/11/11 13:27  0.55
## 475518 578262      72 SWEETHEART FAIRY CAKE CASES        1 23/11/11 13:27  0.55
## 475519 578262     PACK OF 72 RETROSPOT CAKE CASES        1 23/11/11 13:27  0.55
## 475541 578262     60 CAKE CASES VINTAGE CHRISTMAS        5 23/11/11 13:27  0.55
## 476140 578273    PLASTERS IN TIN WOODLAND ANIMALS        1 23/11/11 13:41  1.65
## 476170 578275         LARGE CAKE TOWEL PINK SPOTS        1 23/11/11 13:46  6.75
## 476231 578278        SET 7 BABUSHKA NESTING BOXES        2 23/11/11 13:51  8.50
## 476341 578289          ANGEL DECORATION 3 BUTTONS        1 23/11/11 14:07  0.42
## 476344 578289    WHITE ROCKING HORSE HAND PAINTED        2 23/11/11 14:07  1.25
## 476360 578289   LE JARDIN BOTANIQUE CUSHION COVER        1 23/11/11 14:07  3.75
## 476361 578289      BELLE JARDINIERE CUSHION COVER        1 23/11/11 14:07  3.75
## 476362 578289      BELLE JARDINIERE CUSHION COVER        1 23/11/11 14:07  3.75
## 476364 578289          POSTE FRANCE CUSHION COVER        1 23/11/11 14:07  3.75
## 476365 578289      BELLE JARDINIERE CUSHION COVER        1 23/11/11 14:07  3.75
## 476366 578289      BELLE JARDINIERE CUSHION COVER        1 23/11/11 14:07  3.75
## 476367 578289      BELLE JARDINIERE CUSHION COVER        1 23/11/11 14:07  3.75
## 476368 578289   LE JARDIN BOTANIQUE CUSHION COVER        1 23/11/11 14:07  3.75
## 476370 578289   LE JARDIN BOTANIQUE CUSHION COVER        1 23/11/11 14:07  3.75
## 476371 578289       HOME SWEET HOME CUSHION COVER        1 23/11/11 14:07  3.75
## 476372 578289       HOME SWEET HOME CUSHION COVER        1 23/11/11 14:07  3.75
## 476373 578289          POSTE FRANCE CUSHION COVER        1 23/11/11 14:07  3.75
## 476374 578289          POSTE FRANCE CUSHION COVER        1 23/11/11 14:07  3.75
## 476375 578289       HOME SWEET HOME CUSHION COVER        1 23/11/11 14:07  3.75
## 476387 578289    SET OF 3 HANGING OWLS OLLIE BEAK        1 23/11/11 14:07  1.25
## 476443 578289                FELTCRAFT DOLL EMILY        1 23/11/11 14:07  2.95
## 476909 578307     SET/6 PURPLE BUTTERFLY T-LIGHTS        1 23/11/11 15:53  2.10
## 476910 578307  SET/6 TURQUOISE BUTTERFLY T-LIGHTS        1 23/11/11 15:53  2.10
## 477141 578324         RETROSPOT CIGAR BOX MATCHES        5 23/11/11 17:32  1.25
## 477162 578325     12 MESSAGE CARDS WITH ENVELOPES        1 23/11/11 17:43  1.65
## 477171 578325            COFFEE MUG APPLES DESIGN        6 23/11/11 17:43  2.55
## 477185 578326       RED RETROSPOT ROUND CAKE TINS        1 23/11/11 17:45  9.95
## 477187 578326             RED SPOT GIFT BAG LARGE       12 23/11/11 17:45  1.25
## 478854 578420               DOORMAT 3 SMILEY CATS        2 24/11/11 11:57  8.25
## 478948 578445   CERAMIC CAKE BOWL + HANGING CAKES        1 24/11/11 12:25  2.95
## 479132 578479          PINK HORSE SOCK PUPPET KIT        1 24/11/11 12:48  2.95
## 479143 578479   SET OF 12 FAIRY CAKE BAKING CASES        1 24/11/11 12:48  0.83
## 479220 578488              JUMBO BAG PAISLEY PARK       10 24/11/11 12:53  2.08
## 479221 578488             JUMBO BAG VINTAGE DOILY       10 24/11/11 12:53  2.08
## 479341 578508     SET OF 2 CERAMIC PAINTED HEARTS        1 24/11/11 13:06  1.45
## 479416 578510        STAR DECORATION PAINTED ZINC        4 24/11/11 13:25  0.19
## 479546 578515  3 HEARTS HANGING DECORATION RUSTIC        1 24/11/11 13:40  2.95
## 479578 578516            JUMBO STORAGE BAG SKULLS       10 24/11/11 13:53  2.08
## 479580 578516                JUMBO BAG STRAWBERRY       10 24/11/11 13:53  2.08
## 479660 578519             LUNCH BAG  BLACK SKULL.        1 24/11/11 13:56  1.65
## 479663 578519   ROUND SNACK BOXES SET OF 4 SKULLS        1 24/11/11 13:56  2.95
## 479664 578519         LARGE WHITE HEART OF WICKER        1 24/11/11 13:56  2.95
## 479667 578519     DISCO BALL CHRISTMAS DECORATION       24 24/11/11 13:56  0.12
## 479672 578519  WHITE GOOSE FEATHER CHRISTMAS TREE        2 24/11/11 13:56  2.95
## 479689 578519         CREAM SWEETHEART MINI CHEST        1 24/11/11 13:56 12.75
## 479709 578519             LUNCH BAG  BLACK SKULL.        1 24/11/11 13:56  1.65
## 479712 578519    CUT GLASS T-LIGHT HOLDER OCTAGON        1 24/11/11 13:56  2.55
## 479720 578519    LUNCH BOX WITH CUTLERY RETROSPOT        1 24/11/11 13:56  2.55
## 479722 578519             LUNCH BAG  BLACK SKULL.        1 24/11/11 13:56  1.65
## 479724 578519     PLASTERS IN TIN VINTAGE PAISLEY        1 24/11/11 13:56  1.65
## 479786 578521   PAPER CHAIN KIT VINTAGE CHRISTMAS        1 24/11/11 14:06  2.95
## 479793 578521      NATURAL SLATE HEART CHALKBOARD        1 24/11/11 14:06  2.95
## 479834 578522            SET OF 6 CAKE CHOPSTICKS        1 24/11/11 14:09  1.25
## 479925 578531     ORIGAMI ROSE INCENSE/CANDLE SET        1 24/11/11 14:40  0.85
## 479927 578531  SET/10 BLUE POLKADOT PARTY CANDLES        1 24/11/11 14:40  1.25
## 480151 578541     VEGETABLE GARDEN CHOPPING BOARD        2 24/11/11 15:01  4.95
## 480152 578541           RED APPLES CHOPPING BOARD        2 24/11/11 15:01  4.95
## 480247 578548        BAKING SET 9 PIECE RETROSPOT        1 24/11/11 15:02  4.95
## 480251 578548         GREY HEART HOT WATER BOTTLE        1 24/11/11 15:02  4.25
## 480268 578548         LARGE WHITE HEART OF WICKER        2 24/11/11 15:02  2.95
## 480374 578620             HAND WARMER BIRD DESIGN        1 24/11/11 15:21  2.10
## 480582 578664         6 RIBBONS ELEGANT CHRISTMAS        2 24/11/11 16:59  1.65
## 480755 578676       PLASTERS IN TIN CIRCUS PARADE        1 24/11/11 19:07  1.65
## 480759 578676              PLASTERS IN TIN SKULLS        1 24/11/11 19:07  1.65
## 480763 578676   ROUND SNACK BOXES SET OF 4 FRUITS        2 24/11/11 19:07  2.95
## 480766 578676       12 PENCILS TALL TUBE WOODLAND        1 24/11/11 19:07  0.85
## 480850 578678    WHITE ROCKING HORSE HAND PAINTED        1 24/11/11 19:59  1.25
## 480865 578678         ZINC METAL HEART DECORATION        1 24/11/11 19:59  1.25
## 480885 578678           VINTAGE CHRISTMAS BUNTING        1 24/11/11 19:59  4.95
## 480893 578678              LUNCH BAG PAISLEY PARK        1 24/11/11 19:59  1.65
## 481026 578688       FRENCH BLUE METAL DOOR SIGN 4        1  25/11/11 9:27  1.25
## 481049 578688           ADULT APRON APPLE DELIGHT        1  25/11/11 9:27  4.95
## 481295 578703         3 ROSE MORRIS BOXED CANDLES        1 25/11/11 11:02  1.25
## 481296 578703   3 WHITE CHOC MORRIS BOXED CANDLES        3 25/11/11 11:02  1.25
## 481356 578707        REX CASH+CARRY JUMBO SHOPPER        1 25/11/11 11:20  0.95
## 481363 578707                  BLUE DISCO HANDBAG        1 25/11/11 11:20  1.95
## 481384 578707        REX CASH+CARRY JUMBO SHOPPER        1 25/11/11 11:20  0.95
## 481571 578757          FELT EGG COSY WHITE RABBIT        1 25/11/11 11:41  0.85
## 481586 578757            JUMBO BAG 50'S CHRISTMAS        1 25/11/11 11:41  2.08
## 481609 578757           FELTCRAFT GIRL AMELIE KIT        1 25/11/11 11:41  4.95
## 481610 578757                  RABBIT NIGHT LIGHT        1 25/11/11 11:41  2.08
## 481613 578757  SET3 BOOK BOX GREEN GINGHAM FLOWER        1 25/11/11 11:41  4.25
## 481616 578757         CHRISTMAS CRAFT WHITE FAIRY        1 25/11/11 11:41  1.45
## 481628 578757      CHRISTMAS CRAFT TREE TOP ANGEL        1 25/11/11 11:41  2.10
## 481629 578757      CHRISTMAS CRAFT LITTLE FRIENDS        1 25/11/11 11:41  2.10
## 481632 578757           FELTCRAFT GIRL AMELIE KIT        1 25/11/11 11:41  4.95
## 481634 578757    CHRISTMAS HANGING STAR WITH BELL        1 25/11/11 11:41  0.39
## 481700 578781           SWALLOW SQUARE TISSUE BOX        1 25/11/11 11:54  0.39
## 481715 578781        FLOWER FAIRY 5 DRAWER LINERS        1 25/11/11 11:54  2.55
## 481724 578781      CHRISTMAS RETROSPOT ANGEL WOOD        2 25/11/11 11:54  0.85
## 481725 578781       CHRISTMAS RETROSPOT TREE WOOD        2 25/11/11 11:54  0.85
## 481726 578781   RETROSPOT WOODEN HEART DECORATION        2 25/11/11 11:54  0.85
## 481727 578781       CHRISTMAS RETROSPOT STAR WOOD        2 25/11/11 11:54  0.85
## 481729 578781             PANTRY WASHING UP BRUSH        1 25/11/11 11:54  1.45
## 481733 578781                    SOLDIERS EGG CUP        1 25/11/11 11:54  1.25
## 481735 578781            RED RETROSPOT TISSUE BOX        1 25/11/11 11:54  0.39
## 481749 578781       TRADTIONAL ALPHABET STAMP SET        1 25/11/11 11:54  4.95
## 481750 578781       TRADITIONAL NAUGHTS & CROSSES        2 25/11/11 11:54  1.65
## 481751 578781       WOODLAND BUNNIES LOLLY MAKERS        1 25/11/11 11:54  2.08
## 481755 578781        BUNDLE OF 3 RETRO NOTE BOOKS        1 25/11/11 11:54  1.65
## 481756 578781         LARGE RED BABUSHKA NOTEBOOK        1 25/11/11 11:54  1.25
## 481757 578781          WOOD STAMP SET BEST WISHES        1 25/11/11 11:54  0.83
## 481758 578781                 HAPPY STENCIL CRAFT        1 25/11/11 11:54  1.25
## 481760 578781       TRADTIONAL ALPHABET STAMP SET        1 25/11/11 11:54  4.95
## 481762 578781                   EMPIRE TISSUE BOX        1 25/11/11 11:54  0.39
## 481768 578781        ROLL WRAP 50'S RED CHRISTMAS        1 25/11/11 11:54  1.25
## 481775 578781       CHILDS BREAKFAST SET SPACEBOY        1 25/11/11 11:54  9.95
## 481878 578790                    LIPSTICK PEN RED        6 25/11/11 12:20  0.42
## 481885 578790        GIANT 50'S CHRISTMAS CRACKER        2 25/11/11 12:20  2.89
## 482027 578808             RECYCLING BAG RETROSPOT       10 25/11/11 13:23  2.10
## 482034 578808                PURPLE PAPER PARASOL        1 25/11/11 13:23  2.95
## 482203 578814       12 PENCIL SMALL TUBE WOODLAND        1 25/11/11 13:40  0.65
## 482219 578814           SCANDINAVIAN REDS RIBBONS        1 25/11/11 13:40  1.25
## 482225 578814            PLASTERS IN TIN SPACEBOY        1 25/11/11 13:40  1.65
## 482228 578814 SET OF 20 VINTAGE CHRISTMAS NAPKINS        1 25/11/11 13:40  0.85
## 482229 578814     PACK OF 12 VINTAGE LEAF TISSUES        1 25/11/11 13:40  0.39
## 482231 578814        GIANT 50'S CHRISTMAS CRACKER        1 25/11/11 13:40  2.89
## 482244 578814           SCANDINAVIAN REDS RIBBONS        1 25/11/11 13:40  1.25
## 482267 578814         ROLL WRAP VINTAGE CHRISTMAS        1 25/11/11 13:40  1.25
## 482309 578817   MINIATURE ANTIQUE ROSE HOOK IVORY        1 25/11/11 13:45  0.83
## 482349 578817    CHRISTMAS HANGING STAR WITH BELL        1 25/11/11 13:45  0.39
## 482444 578824      MINI LIGHTS WOODLAND MUSHROOMS        1 25/11/11 14:02  3.75
## 484097 578852     RECIPE BOX PANTRY YELLOW DESIGN        1 27/11/11 11:12  2.95
## 484102 578852      PACK OF 60 MUSHROOM CAKE CASES        1 27/11/11 11:12  0.55
## 484139 578852             PACK OF 12 SUKI TISSUES        1 27/11/11 11:12  0.39
## 484153 578852        SMALL HEART MEASURING SPOONS        1 27/11/11 11:12  0.85
## 484154 578852           MINI LADLE LOVE HEART RED        1 27/11/11 11:12  0.42
## 484342 578901           PACK OF 6 BIRDY GIFT TAGS        1 27/11/11 11:47  1.25
## 484354 578901        REX CASH+CARRY JUMBO SHOPPER        1 27/11/11 11:47  0.95
## 484436 578921                 HOME SWEET HOME MUG        1 27/11/11 11:57  1.65
## 484440 578921      PACK OF 60 DINOSAUR CAKE CASES        1 27/11/11 11:57  0.55
## 484442 578921     60 CAKE CASES DOLLY GIRL DESIGN        1 27/11/11 11:57  0.55
## 484449 578921                   DOLLY GIRL BEAKER        1 27/11/11 11:57  1.25
## 484452 578921           VINTAGE CHRISTMAS BUNTING        1 27/11/11 11:57  4.95
## 484454 578921      PACK OF 60 SPACEBOY CAKE CASES        1 27/11/11 11:57  0.55
## 484455 578921     60 CAKE CASES DOLLY GIRL DESIGN        1 27/11/11 11:57  0.55
## 484456 578921                DOLLY GIRL LUNCH BOX        1 27/11/11 11:57  1.95
## 484485 578921                  RABBIT NIGHT LIGHT        1 27/11/11 11:57  2.08
## 484501 578921                 MOTORING TISSUE BOX        1 27/11/11 11:57  0.39
## 484503 578921      SET 36 COLOUR PENCILS SPACEBOY        1 27/11/11 11:57  1.25
## 484517 578921            DOLLY GIRL MINI BACKPACK        1 27/11/11 11:57  4.15
## 484528 578921            SILK PURSE BABUSHKA BLUE        1 27/11/11 11:57  3.35
## 484532 578921 4 LAVENDER BOTANICAL DINNER CANDLES        1 27/11/11 11:57  1.25
## 484535 578921    SET 36 COLOUR PENCILS DOLLY GIRL        1 27/11/11 11:57  1.25
## 484536 578921      SET 36 COLOUR PENCILS SPACEBOY        1 27/11/11 11:57  1.25
## 484538 578921         60 TEATIME FAIRY CAKE CASES        1 27/11/11 11:57  0.55
## 484539 578921    HANGING HEART JAR T-LIGHT HOLDER        1 27/11/11 11:57  1.25
## 484541 578921                   EMPIRE TISSUE BOX        2 27/11/11 11:57  0.39
## 484542 578921        PAINTED METAL PEARS ASSORTED        2 27/11/11 11:57  1.69
## 484611 578924     TRADITIONAL PICK UP STICKS GAME        3 27/11/11 12:10  1.25
## 484678 578926          PINK HORSE SOCK PUPPET KIT        1 27/11/11 12:24  2.95
## 484682 578926 SET OF 20 VINTAGE CHRISTMAS NAPKINS        1 27/11/11 12:24  0.85
## 484687 578926       HAND WARMER SCOTTY DOG DESIGN        1 27/11/11 12:24  2.10
## 484693 578926      SET/2 RED RETROSPOT TEA TOWELS        1 27/11/11 12:24  3.25
## 484699 578926           GINGHAM BABUSHKA DOORSTOP        1 27/11/11 12:24  3.75
## 484701 578926           FELTCRAFT CHRISTMAS FAIRY        1 27/11/11 12:24  4.25
## 484702 578926  SET OF 72 RETROSPOT PAPER  DOILIES        1 27/11/11 12:24  1.45
## 484704 578926            DOORSTOP RETROSPOT HEART        1 27/11/11 12:24  3.75
## 484709 578926          RED RETROSPOT PUDDING BOWL        1 27/11/11 12:24  4.25
## 484712 578926      CHRISTMAS CRAFT LITTLE FRIENDS        1 27/11/11 12:24  2.10
## 484713 578926        RED RETROSPOT SUGAR JAM BOWL        1 27/11/11 12:24  2.55
## 484717 578926    RED RETROSPOT TEA CUP AND SAUCER        1 27/11/11 12:24  3.75
## 484728 578926          CHOCOLATE HOT WATER BOTTLE        1 27/11/11 12:24  4.95
## 484774 578927              LUNCH BAG APPLE DESIGN        2 27/11/11 12:26  1.65
## 484803 578928              CARD CHRISTMAS VILLAGE       12 27/11/11 12:29  0.42
## 484861 578928     TRADITIONAL PICK UP STICKS GAME        2 27/11/11 12:29  1.25
## 484882 578929  WOOD 2 DRAWER CABINET WHITE FINISH        2 27/11/11 12:31  6.95
## 484941 578933   DOORMAT UNION JACK GUNS AND ROSES        1 27/11/11 12:47  8.25
## 484994 578935              SPACEBOY CHILDRENS CUP        1 27/11/11 12:52  1.25
## 485000 578935               CLASSIC BICYCLE CLIPS        1 27/11/11 12:52  1.45
## 485028 578935           IVORY WICKER HEART MEDIUM        1 27/11/11 12:52  1.25
## 485041 578935         VINTAGE DOILY JUMBO BAG RED        1 27/11/11 12:52  2.08
## 485094 578936    PACK OF 20 NAPKINS PANTRY DESIGN        1 27/11/11 13:00  0.85
## 485229 578941           PARTY TIME PENCIL ERASERS        1 27/11/11 13:26  0.21
## 485369 578942     TRADITIONAL PICK UP STICKS GAME        1 27/11/11 13:29  1.25
## 485381 578942 SET OF 20 VINTAGE CHRISTMAS NAPKINS        1 27/11/11 13:29  0.85
## 485462 578944              LUNCH BAG APPLE DESIGN        1 27/11/11 13:41  1.65
## 485464 578944         LARGE WHITE HEART OF WICKER        1 27/11/11 13:41  2.95
## 485487 578944     VINTAGE DOILY TRAVEL SEWING KIT        1 27/11/11 13:41  1.95
## 485491 578944                   TOY TIDY SPACEBOY        1 27/11/11 13:41  2.10
## 485492 578944        BUNDLE OF 3 RETRO NOTE BOOKS        1 27/11/11 13:41  1.65
## 485520 578946            SMOKEY GREY COLOUR GLASS        4 27/11/11 13:47  0.29
## 485562 578946            COFFEE MUG PEARS  DESIGN        1 27/11/11 13:47  2.55
## 485584 578947          ACRYLIC JEWEL ICICLE, PINK        3 27/11/11 13:49  0.38
## 485633 578949    TRAVEL CARD WALLET I LOVE LONDON        1 27/11/11 14:30  0.42
## 485634 578949   TRAVEL CARD WALLET VINTAGE TICKET        1 27/11/11 14:30  0.42
## 485657 578949       SET OF 4 NAPKIN CHARMS HEARTS        1 27/11/11 14:30  2.55
## 485661 578949                  SPACEBOY LUNCH BOX        1 27/11/11 14:30  1.95
## 485675 578949                   EMPIRE TISSUE BOX        2 27/11/11 14:30  0.39
## 485677 578949            REGENCY CAKESTAND 3 TIER        1 27/11/11 14:30 12.75
## 485704 578949                    SOLDIERS EGG CUP        2 27/11/11 14:30  1.25
## 485706 578949            FAUX FUR CHOCOLATE THROW        1 27/11/11 14:30 19.95
## 485714 578950     DISCO BALL CHRISTMAS DECORATION       24 27/11/11 14:40  0.12
## 485716 578950  PLAYING CARDS KEEP CALM & CARRY ON        1 27/11/11 14:40  1.25
## 485725 578950               BOOM BOX SPEAKER BOYS        1 27/11/11 14:40  5.95
## 485729 578950              HAND WARMER UNION JACK        1 27/11/11 14:40  2.10
## 485746 578950         JUMBO BAG DOLLY GIRL DESIGN        1 27/11/11 14:40  2.08
## 485748 578950   JUMBO SHOPPER VINTAGE RED PAISLEY        1 27/11/11 14:40  2.08
## 485758 578950     DISCO BALL CHRISTMAS DECORATION       24 27/11/11 14:40  0.12
## 485759 578950                 MIRRORED DISCO BALL        1 27/11/11 14:40  5.95
## 485760 578950                  RABBIT NIGHT LIGHT        1 27/11/11 14:40  2.08
## 485768 578950       TRADTIONAL ALPHABET STAMP SET        1 27/11/11 14:40  4.95
## 485770 578950           PLASTERS IN TIN STRONGMAN        1 27/11/11 14:40  1.65
## 485778 578951               LONDON BUS COFFEE MUG       12 27/11/11 14:40  2.55
## 485779 578951                    SOLDIERS EGG CUP       12 27/11/11 14:40  1.25
## 485884 578977      BELLE JARDINIERE CUSHION COVER        3 27/11/11 15:18  3.75
## 485917 578977    GLASS SPHERE CANDLE STAND MEDIUM        1 27/11/11 15:18  5.45
## 485960 578992         LARGE PARLOUR PICTURE FRAME        1 27/11/11 15:38  4.95
## 485992 578993        PAINTED LIGHTBULB STAR+ MOON        1 27/11/11 15:38  0.42
## 486001 578993        PACK OF 6 LARGE FRUIT STRAWS        1 27/11/11 15:38  0.62
## 486005 578993           NOEL GARLAND PAINTED ZINC       12 27/11/11 15:38  0.39
## 486054 578995           HEART IVORY TRELLIS SMALL        1 27/11/11 15:59  1.25
## 486169 578998      KNEELING MAT HOUSEWORK  DESIGN        1 27/11/11 16:05  1.65
## 486177 578998       DECORATIVE WICKER HEART LARGE        1 27/11/11 16:05  1.65
## 486183 578998      DECORATIVE WICKER HEART MEDIUM        1 27/11/11 16:05  1.25
## 486189 578998      RETRO PILL BOX , REVOLUTIONARY        1 27/11/11 16:05  0.19
## 486194 578998      JINGLE BELL HEART ANTIQUE GOLD        1 27/11/11 16:05  2.08
## 486195 578998    JINGLE BELL HEART ANTIQUE SILVER        1 27/11/11 16:05  2.08
## 486201 578998      JINGLE BELL HEART ANTIQUE GOLD        1 27/11/11 16:05  2.08
## 486202 578998    JINGLE BELL HEART ANTIQUE SILVER        1 27/11/11 16:05  2.08
## 486203 578998    CHRISTMAS HANGING STAR WITH BELL        1 27/11/11 16:05  0.39
## 486205 578998               HEART OF WICKER LARGE        1 27/11/11 16:05  2.95
## 486210 578998    JINGLE BELL HEART ANTIQUE SILVER        1 27/11/11 16:05  2.08
## 486211 578998      JINGLE BELL HEART ANTIQUE GOLD        1 27/11/11 16:05  2.08
## 486213 578998      72 SWEETHEART FAIRY CAKE CASES        1 27/11/11 16:05  0.55
## 486215 578998   SET 12 COLOUR PENCILS LOVE LONDON        1 27/11/11 16:05  0.65
## 486216 578998              JAM MAKING SET PRINTED        1 27/11/11 16:05  1.45
## 486222 578998              HAND WARMER UNION JACK        1 27/11/11 16:05  2.10
## 486223 578998           PLASTERS IN TIN STRONGMAN        1 27/11/11 16:05  1.65
## 486234 578998       HAND WARMER SCOTTY DOG DESIGN        1 27/11/11 16:05  2.10
## 486238 578998     RECIPE BOX PANTRY YELLOW DESIGN        1 27/11/11 16:05  2.95
## 486413 579002    TRAVEL CARD WALLET FLOWER MEADOW        6 27/11/11 16:27  0.42
## 486419 579002             TRAVEL CARD WALLET SUKI        6 27/11/11 16:27  0.42
## 486435 579002                    HEART CALCULATOR        1 27/11/11 16:27  1.25
## 486457 579002                    HEART CALCULATOR        1 27/11/11 16:27  1.25
## 486473 579002   SET OF 3 BUTTERFLY COOKIE CUTTERS        1 27/11/11 16:27  1.45
## 486946 579099             TEATIME PEN CASE & PENS        1 28/11/11 11:26  0.85
## 487205 579124       VINTAGE RED ENAMEL TRIM PLATE       12 28/11/11 12:14  1.65
## 487206 579124        12 HANGING EGGS HAND PAINTED        1 28/11/11 12:14  2.08
## 487207 579124   ASSORTED SHAPES PHOTO CLIP SILVER        1 28/11/11 12:14  0.65
## 487209 579124   ASSORTED SHAPES PHOTO CLIP SILVER        2 28/11/11 12:14  0.65
## 487217 579124  FOLK FELT HANGING MULTICOL GARLAND        1 28/11/11 12:14  3.75
## 487222 579124              HAND WARMER UNION JACK        2 28/11/11 12:14  2.10
## 487228 579124      RED GINGHAM ROSE JEWELLERY BOX        2 28/11/11 12:14  1.95
## 487335 579132         ROCKING HORSE RED CHRISTMAS        1 28/11/11 12:35  0.85
## 487356 579132       HAND WARMER SCOTTY DOG DESIGN        1 28/11/11 12:35  2.10
## 487357 579132                         WICKER STAR        1 28/11/11 12:35  2.10
## 487359 579132              PLASTERS IN TIN SKULLS        1 28/11/11 12:35  1.65
## 487361 579132              HAND WARMER UNION JACK        1 28/11/11 12:35  2.10
## 487432 579135         12 PENCILS TALL TUBE SKULLS        2 28/11/11 12:44  0.85
## 487433 579135  12 PENCILS TALL TUBE RED RETROSPOT        2 28/11/11 12:44  0.85
## 487450 579135          CHOCOLATE HOT WATER BOTTLE        1 28/11/11 12:44  4.95
## 487453 579135         SMALL WHITE HEART OF WICKER        3 28/11/11 12:44  1.65
## 487513 579141        MODERN FLORAL STATIONERY SET        2 28/11/11 13:06  1.25
## 487515 579141              MONSTERS STENCIL CRAFT        1 28/11/11 13:06  1.25
## 487517 579141    SMALL WHITE RETROSPOT MUG IN BOX        1 28/11/11 13:06  3.75
## 487518 579141         BOX OF 6 MINI 50'S CRACKERS        1 28/11/11 13:06  2.49
## 487519 579141        RETROSPOT SMALL TUBE MATCHES        1 28/11/11 13:06  1.65
## 487549 579141        GIANT 50'S CHRISTMAS CRACKER        1 28/11/11 13:06  2.89
## 487649 579145           PARTY TIME PENCIL ERASERS        1 28/11/11 13:13  0.21
## 487656 579145     SCANDINAVIAN PAISLEY PICNIC BAG        1 28/11/11 13:13  1.65
## 487660 579145               REVOLVER WOODEN RULER        1 28/11/11 13:13  1.95
## 487661 579145             SNACK TRAY HAPPY FOREST        1 28/11/11 13:13  1.95
## 487662 579145            SNACK TRAY I LOVE LONDON        1 28/11/11 13:13  1.95
## 487663 579145                      POPCORN HOLDER        4 28/11/11 13:13  0.85
## 487664 579145    SET OF 4 KNICK KNACK TINS LONDON        1 28/11/11 13:13  4.15
## 487665 579145 BUNDLE OF 3 ALPHABET EXERCISE BOOKS        1 28/11/11 13:13  1.65
## 487688 579146               LOVE HOT WATER BOTTLE        1 28/11/11 13:14  5.95
## 487689 579146        SCOTTIE DOG HOT WATER BOTTLE        1 28/11/11 13:14  4.95
## 487691 579146               LOVE HOT WATER BOTTLE        1 28/11/11 13:14  5.95
## 487694 579146        SCOTTIE DOG HOT WATER BOTTLE        1 28/11/11 13:14  4.95
## 487696 579146        SCOTTIE DOG HOT WATER BOTTLE        1 28/11/11 13:14  4.95
## 487718 579146               LOVE HOT WATER BOTTLE        1 28/11/11 13:14  5.95
## 487894 579155                 ECONOMY LUGGAGE TAG        1 28/11/11 13:37  1.25
## 487982 579161         PINK HAPPY BIRTHDAY BUNTING        1 28/11/11 13:56  5.45
## 487990 579161         CHARLOTTE BAG PINK POLKADOT        1 28/11/11 13:56  0.85
## 488008 579161      SET OF 4 ENGLISH ROSE COASTERS        1 28/11/11 13:56  1.25
## 488025 579161  SET OF 60 I LOVE LONDON CAKE CASES        1 28/11/11 13:56  0.55
## 488044 579161         PENS ASSORTED FUNKY JEWELED       36 28/11/11 13:56  0.19
## 488132 579167      CERAMIC CHERRY CAKE MONEY BANK        8 28/11/11 14:06  1.45
## 488137 579167           COOK WITH WINE METAL SIGN        2 28/11/11 14:06  2.08
## 488169 579167     CERAMIC CAKE DESIGN SPOTTED MUG        1 28/11/11 14:06  1.49
## 488186 579167          ENAMEL MEASURING JUG CREAM        1 28/11/11 14:06  4.25
## 488209 579167     CERAMIC CAKE DESIGN SPOTTED MUG        1 28/11/11 14:06  1.49
## 488213 579167       SET OF 6 HERB TINS SKETCHBOOK        1 28/11/11 14:06  3.95
## 488221 579167       DAIRY MAID TRADITIONAL TEAPOT        1 28/11/11 14:06  6.95
## 488222 579167           DAIRY MAID LARGE MILK JUG        1 28/11/11 14:06  4.95
## 488382 579171                    SOLDIERS EGG CUP       12 28/11/11 14:30  1.25
## 488384 579171         PLAYING CARDS I LOVE LONDON        2 28/11/11 14:30  1.25
## 488389 579171                     JUMBO BAG PEARS        1 28/11/11 14:30  2.08
## 488390 579171         VINTAGE DOILY JUMBO BAG RED        1 28/11/11 14:30  2.08
## 490046 579286         BOX OF 24 COCKTAIL PARASOLS        1 29/11/11 10:57  0.42
## 490062 579286      PAPER CHAIN KIT 50'S CHRISTMAS        1 29/11/11 10:57  2.95
## 490064 579286        ADVENT CALENDAR GINGHAM SACK        1 29/11/11 10:57  5.95
## 490181 579293                FELTCRAFT DOLL MOLLY        1 29/11/11 11:22  2.95
## 490188 579293      PANTRY MAGNETIC  SHOPPING LIST        1 29/11/11 11:22  1.45
## 490189 579293       VINTAGE LEAF MAGNETIC NOTEPAD        1 29/11/11 11:22  1.45
## 490676 579387         RETROSPOT CIGAR BOX MATCHES        2 29/11/11 12:06  1.25
## 490680 579387   SET OF 6 RIBBONS PERFECTLY PRETTY        1 29/11/11 12:06  2.89
## 490860 579401           RIBBON REEL HEARTS DESIGN        5 29/11/11 12:12  1.65
## 490995 579408         BICYCLE PUNCTURE REPAIR KIT        1 29/11/11 12:34  2.08
## 490998 579408       VINTAGE LEAF MAGNETIC NOTEPAD        1 29/11/11 12:34  1.45
## 491000 579408                CHOCOLATE CALCULATOR        1 29/11/11 12:34  1.65
## 491001 579408           PACK OF 6 BIRDY GIFT TAGS        1 29/11/11 12:34  1.25
## 491078 579413  WOOD 2 DRAWER CABINET WHITE FINISH        2 29/11/11 12:50  6.95
## 491087 579413     CERAMIC CAKE DESIGN SPOTTED MUG        2 29/11/11 12:50  1.49
## 491088 579413       CERAMIC STRAWBERRY DESIGN MUG        2 29/11/11 12:50  1.49
## 491110 579414     GLASS JAR ENGLISH CONFECTIONERY        1 29/11/11 12:52  2.95
## 491218 579430    POCKET BAG BLUE PAISLEY RED SPOT        1 29/11/11 13:06  1.25
## 491221 579430              HAND WARMER OWL DESIGN        1 29/11/11 13:06  2.10
## 491225 579430       HAND WARMER SCOTTY DOG DESIGN        1 29/11/11 13:06  2.10
## 491228 579430         HAND WARMER BABUSHKA DESIGN        1 29/11/11 13:06  2.10
## 491422 579447              SPACEBOY MINI BACKPACK        2 29/11/11 13:46  4.15
## 491547 579456     VINTAGE DOILY TRAVEL SEWING KIT        1 29/11/11 14:20  1.95
## 491550 579456                  RABBIT NIGHT LIGHT        3 29/11/11 14:20  2.08
## 491556 579456                IVORY KITCHEN SCALES        1 29/11/11 14:20  8.50
## 491590 579458         12 PENCILS TALL TUBE SKULLS        1 29/11/11 14:38  0.85
## 491612 579458         SMALL WHITE HEART OF WICKER        1 29/11/11 14:38  1.65
## 491621 579458           TRAVEL CARD WALLET PANTRY        1 29/11/11 14:38  0.42
## 491625 579458             HAND WARMER BIRD DESIGN        1 29/11/11 14:38  2.10
## 491628 579458      SWEETHEART CERAMIC TRINKET BOX        1 29/11/11 14:38  1.25
## 491629 579458   STAR T-LIGHT HOLDER WILLIE WINKIE        1 29/11/11 14:38  1.65
## 491632 579458          METAL SIGN DROP YOUR PANTS        1 29/11/11 14:38  2.89
## 491635 579458       DECORATIVE WICKER HEART LARGE        1 29/11/11 14:38  1.65
## 491636 579458            IVORY WICKER HEART LARGE        2 29/11/11 14:38  1.65
## 491637 579458  WHITE HANGING HEART T-LIGHT HOLDER        1 29/11/11 14:38  2.95
## 491648 579458   STAR T-LIGHT HOLDER WILLIE WINKIE        1 29/11/11 14:38  1.65
## 491649 579458          HOME SWEET HOME KEY HOLDER        1 29/11/11 14:38  6.25
## 491651 579458                  JUMBO BAG ALPHABET        1 29/11/11 14:38  2.08
## 491656 579458            JUMBO BAG 50'S CHRISTMAS        1 29/11/11 14:38  2.08
## 491658 579458                HOT BATHS METAL SIGN        1 29/11/11 14:38  2.10
## 491662 579458          FOUR HOOK  WHITE LOVEBIRDS        1 29/11/11 14:38  2.10
## 491665 579458   SMALL HANGING IVORY/RED WOOD BIRD        1 29/11/11 14:38  0.42
## 491667 579458                    SOLDIERS EGG CUP        1 29/11/11 14:38  1.25
## 491672 579458           LUNCH BAG ALPHABET DESIGN        1 29/11/11 14:38  1.65
## 491673 579458  3 HEARTS HANGING DECORATION RUSTIC        1 29/11/11 14:38  2.95
## 491678 579458             HAND WARMER BIRD DESIGN        1 29/11/11 14:38  2.10
## 491679 579458              HAND WARMER UNION JACK        1 29/11/11 14:38  2.10
## 491681 579458              HAND WARMER OWL DESIGN        1 29/11/11 14:38  2.10
## 491682 579458             HAND WARMER BIRD DESIGN        1 29/11/11 14:38  2.10
## 491685 579458           TRAVEL CARD WALLET SKULLS        1 29/11/11 14:38  0.42
## 491686 579458     PACK OF 12 PAISLEY PARK TISSUES        1 29/11/11 14:38  0.39
## 491689 579458                      GLAMOROUS  MUG        1 29/11/11 14:38  1.25
## 491691 579458                   WHITE WICKER STAR        1 29/11/11 14:38  2.10
## 491760 579465                   WHITE WICKER STAR        1 29/11/11 14:53  2.10
## 491832 579468                IVORY KITCHEN SCALES        1 29/11/11 14:58  8.50
## 491997 579470     VICTORIAN GLASS HANGING T-LIGHT        6 29/11/11 15:06  1.95
## 492275 579472        SET OF 4 PANTRY JELLY MOULDS        1 29/11/11 15:09  1.25
## 492276 579472   SET OF 12 FAIRY CAKE BAKING CASES        1 29/11/11 15:09  0.83
## 492288 579472        SMALL HEART MEASURING SPOONS        1 29/11/11 15:09  0.85
## 492298 579472            WOOD STAMP SET THANK YOU        1 29/11/11 15:09  0.83
## 492315 579472         VINTAGE RED ENAMEL TRIM MUG        1 29/11/11 15:09  1.25
## 492316 579472      ROTATING LEAVES T-LIGHT HOLDER        1 29/11/11 15:09  1.25
## 492318 579472        DOLLY GIRL CHILDRENS EGG CUP        1 29/11/11 15:09  1.25
## 492323 579472        GIANT 50'S CHRISTMAS CRACKER        1 29/11/11 15:09  2.89
## 492370 579491     FOOD CONTAINER SET 3 LOVE HEART        2 29/11/11 15:23  1.95
## 492376 579491      ROTATING LEAVES T-LIGHT HOLDER        1 29/11/11 15:23  1.25
## 492380 579491          HAND WARMER RED LOVE HEART        1 29/11/11 15:23  2.10
## 492409 579491    PLAYING CARDS JUBILEE UNION JACK        2 29/11/11 15:23  1.25
## 492420 579491                    6 RIBBONS EMPIRE        1 29/11/11 15:23  1.65
## 493856 579516 ASSORTED COLOUR LIZARD SUCTION HOOK        2 29/11/11 17:52  0.42
## 493878 579516          METAL SIGN DROP YOUR PANTS        1 29/11/11 17:52  2.89
## 493896 579516         DOORMAT WELCOME TO OUR HOME        1 29/11/11 17:52  8.25
## 493901 579516         DOORMAT WELCOME TO OUR HOME        1 29/11/11 17:52  8.25
## 493982 579520           POPPY'S PLAYHOUSE KITCHEN        1 29/11/11 18:14  2.10
## 493995 579520       JIGSAW TREE WITH WATERING CAN        1 29/11/11 18:14  0.29
## 494283 579541        LANDMARK FRAME COVENT GARDEN        1 30/11/11 10:12 12.50
## 494479 579555         LARGE WHITE HEART OF WICKER        2 30/11/11 11:08  2.95
## 494528 579555             CREAM HEART CARD HOLDER        1 30/11/11 11:08  3.95
## 494563 579556              HAND WARMER OWL DESIGN        2 30/11/11 11:17  2.10
## 494564 579556       HAND WARMER SCOTTY DOG DESIGN        2 30/11/11 11:17  2.10
## 494821 579600        FELTCRAFT PRINCESS LOLA DOLL        8 30/11/11 12:00  3.75
## 494853 579605           PLASTERS IN TIN STRONGMAN        6 30/11/11 12:01  1.65
## 494902 579629           LUNCH BAG ALPHABET DESIGN        1 30/11/11 12:16  1.65
## 495076 579673       LUNCH BAG VINTAGE LEAF DESIGN        1 30/11/11 12:59  1.65
## 495080 579673       LUNCH BAG VINTAGE LEAF DESIGN        1 30/11/11 12:59  1.65
## 495250 579690       TRADITIONAL CHRISTMAS RIBBONS        1 30/11/11 14:03  1.25
## 495253 579690     60 CAKE CASES VINTAGE CHRISTMAS        1 30/11/11 14:03  0.55
## 495568 579711   PACK OF 12 50'S CHRISTMAS TISSUES        1 30/11/11 14:17  0.39
## 495577 579711               SWEETHEART BIRD HOUSE        1 30/11/11 14:17  4.15
## 495578 579711           SCANDINAVIAN REDS RIBBONS        1 30/11/11 14:17  1.25
## 495601 579711          GREEN HEART COMPACT MIRROR        1 30/11/11 14:17  1.25
## 495721 579744         CIRCUS PARADE BABY GIFT SET        1 30/11/11 14:38 16.95
## 497850 580027                 SAVE THE PLANET MUG        1 01/12/11 12:01  1.65
## 498031 580048             LUNCH BAG  BLACK SKULL.        1 01/12/11 12:53  1.65
## 498033 580048   ROUND SNACK BOXES SET OF 4 SKULLS        1 01/12/11 12:53  2.95
## 498180 580054     DOG TOY WITH PINK CROCHET SKIRT        2 01/12/11 13:08  3.75
## 498206 580054        BAKING SET 9 PIECE RETROSPOT        2 01/12/11 13:08  4.95
## 498270 580059     HOT WATER BOTTLE I AM SO POORLY       12 01/12/11 13:22  4.95
## 498463 580075       LUNCH BAG VINTAGE LEAF DESIGN        1 01/12/11 14:09  1.65
## 499677 580128           OVAL  MINI PORTRAIT FRAME        4 01/12/11 17:56  1.95
## 499687 580128      PANTRY MAGNETIC  SHOPPING LIST        1 01/12/11 17:56  1.45
## 499780 580133    AGED GLASS SILVER T-LIGHT HOLDER       12 01/12/11 18:43  0.65
## 499835 580136              WOODEN REGATTA BUNTING        1 01/12/11 19:42  5.95
## 499883 580136    SQUARE FLOOR CUSHION VINTAGE RED        1 01/12/11 19:42  7.95
## 499897 580136                    LIPSTICK PEN RED        1 01/12/11 19:42  0.42
## 499902 580136      PACK OF 60 MUSHROOM CAKE CASES        1 01/12/11 19:42  0.55
## 499976 580137          FRENCH ENAMEL CANDLEHOLDER        1 01/12/11 19:54  2.10
## 499998 580137                DOLLY GIRL LUNCH BOX        1 01/12/11 19:54  1.95
## 500002 580137          FRENCH ENAMEL CANDLEHOLDER        1 01/12/11 19:54  2.10
## 500005 580137                  SPACEBOY LUNCH BOX        1 01/12/11 19:54  1.95
## 500007 580137                DOLLY GIRL LUNCH BOX        1 01/12/11 19:54  1.95
## 500008 580137                  SPACEBOY LUNCH BOX        1 01/12/11 19:54  1.95
## 500519 580164   HANGING HEART ZINC T-LIGHT HOLDER       12 02/12/11 11:16  0.85
## 500666 580193                BLUE REFECTORY CLOCK        1 02/12/11 12:03  9.95
## 500730 580256                   GUMBALL COAT RACK       12 02/12/11 12:24  2.55
## 500901 580272 SET OF 3 WOODEN STOCKING DECORATION        3 02/12/11 12:52  1.25
## 500957 580276   PINK CREAM FELT CRAFT TRINKET BOX        1 02/12/11 12:59  1.25
## 500992 580276       PLASTERS IN TIN CIRCUS PARADE        1 02/12/11 12:59  1.65
## 501041 580278    RED HANGING HEART T-LIGHT HOLDER        1 02/12/11 13:11  2.95
## 501149 580284     ASSORTED COLOURED CIRCLE MOBILE        1 02/12/11 13:21  0.42
## 501184 580287       DOORMAT KEEP CALM AND COME IN        2 02/12/11 13:28  8.25
## 501212 580289           COOK WITH WINE METAL SIGN       12 02/12/11 13:32  2.08
## 501221 580289           COOK WITH WINE METAL SIGN       12 02/12/11 13:32  2.08
## 501247 580290      SET 12 COLOUR PENCILS SPACEBOY        1 02/12/11 13:35  0.65
## 501322 580293      METAL SIGN TAKE IT OR LEAVE IT        1 02/12/11 13:38  2.95
## 501326 580293           AIRLINE LOUNGE,METAL SIGN        1 02/12/11 13:38  2.10
## 501328 580293           COOK WITH WINE METAL SIGN        1 02/12/11 13:38  2.08
## 501565 580305            TREASURE ISLAND BOOK BOX        1 02/12/11 14:26  2.25
## 501566 580305      BUFFALO BILL TREASURE BOOK BOX        1 02/12/11 14:26  2.25
## 501593 580305                  RABBIT NIGHT LIGHT        4 02/12/11 14:26  2.08
## 501601 580305        PACK OF 6 SMALL FRUIT STRAWS        1 02/12/11 14:26  0.42
## 501610 580305  SET 6 FOOTBALL CELEBRATION CANDLES        1 02/12/11 14:26  1.25
## 501611 580305           SWALLOW SQUARE TISSUE BOX        1 02/12/11 14:26  0.39
## 501628 580305    PLAYING CARDS JUBILEE UNION JACK        1 02/12/11 14:26  1.25
## 501637 580305                 CARD BILLBOARD FONT       12 02/12/11 14:26  0.42
## 501646 580305   PACK OF 6 COCKTAIL PARASOL STRAWS        1 02/12/11 14:26  0.42
## 501648 580305        PACK OF 6 SMALL FRUIT STRAWS        1 02/12/11 14:26  0.42
## 501653 580305      RED WOOLLY HOTTIE WHITE HEART.        1 02/12/11 14:26  4.25
## 501657 580305         ROLL WRAP VINTAGE CHRISTMAS        4 02/12/11 14:26  1.25
## 501659 580305         JUMBO BAG VINTAGE CHRISTMAS        1 02/12/11 14:26  2.08
## 501660 580305        PACK OF 6 SMALL FRUIT STRAWS        1 02/12/11 14:26  0.42
## 501661 580305           ASS COLOUR GLOWING TIARAS        1 02/12/11 14:26  0.85
## 501662 580305           POPPY'S PLAYHOUSE KITCHEN        1 02/12/11 14:26  2.10
## 501664 580305   BALLOON ART MAKE YOUR OWN FLOWERS        1 02/12/11 14:26  0.39
## 501665 580305   PACK OF 6 COCKTAIL PARASOL STRAWS        1 02/12/11 14:26  0.42
## 501672 580305                   BLUE POLKADOT CUP        2 02/12/11 14:26  0.85
## 501673 580305        ROLL WRAP 50'S RED CHRISTMAS        2 02/12/11 14:26  1.25
## 501674 580305            ROLL WRAP 50'S CHRISTMAS        2 02/12/11 14:26  1.25
## 501709 580307 ROTATING SILVER ANGELS T-LIGHT HLDR        1 02/12/11 14:30  2.55
## 501980 580358   PAPER CHAIN KIT VINTAGE CHRISTMAS        1 02/12/11 16:07  2.95
## 501981 580358               CLASSIC BICYCLE CLIPS        1 02/12/11 16:07  1.45
## 501985 580358               CLASSIC BICYCLE CLIPS        1 02/12/11 16:07  1.45
## 502697 580367      METAL SIGN,CUPCAKE SINGLE HOOK        1 02/12/11 16:39  2.46
## 502885 580385  LARGE  TALL CAMPHOR WOOD TOADSTOOL        2 04/12/11 10:11  1.25
## 502886 580385   LARGE CAMPHOR WOOD FIELD MUSHROOM        2 04/12/11 10:11  1.25
## 502893 580385       HAND WARMER SCOTTY DOG DESIGN        2 04/12/11 10:11  2.10
## 502894 580385  LARGE  TALL CAMPHOR WOOD TOADSTOOL        2 04/12/11 10:11  1.25
## 503005 580396    SET OF 6 SNACK LOAF BAKING CASES        1 04/12/11 11:00  0.83
## 503010 580396    LARGE CAKE TOWEL CHOCOLATE SPOTS        1 04/12/11 11:00  1.95
## 503011 580396    SET OF 12 MINI LOAF BAKING CASES        1 04/12/11 11:00  0.83
## 503023 580396              WOODEN BOX OF DOMINOES        1 04/12/11 11:00  1.25
## 503123 580399           CARAVAN SQUARE TISSUE BOX        1 04/12/11 11:45  0.39
## 503143 580399               ROSE CARAVAN DOORSTOP        2 04/12/11 11:45  1.95
## 503154 580399  SWISS ROLL TOWEL, CHOCOLATE  SPOTS        1 04/12/11 11:45  1.25
## 503161 580399              RED GINGHAM TEDDY BEAR        1 04/12/11 11:45  2.95
## 503197 580399                  RED KITCHEN SCALES        1 04/12/11 11:45  8.50
## 503209 580399              ENAMEL BREAD BIN CREAM        1 04/12/11 11:45 12.75
## 503250 580402       CHRISTMAS PUDDING TRINKET POT       10 04/12/11 11:55  0.39
## 503406 580434      DECORATIVE WICKER HEART MEDIUM        1 04/12/11 12:17  1.25
## 503412 580434       DECORATIVE WICKER HEART LARGE        1 04/12/11 12:17  1.65
## 503415 580434         LARGE WHITE HEART OF WICKER        1 04/12/11 12:17  2.95
## 503469 580468         HANGING METAL HEART LANTERN        1 04/12/11 12:31  0.79
## 503474 580468         GINGHAM HEART  DOORSTOP RED        4 04/12/11 12:31  1.95
## 503478 580468           SPOTTY PINK DUCK DOORSTOP        2 04/12/11 12:31  1.95
## 503496 580469      PARTY PIZZA DISH RED RETROSPOT        3 04/12/11 12:32  0.19
## 503497 580469     PARTY PIZZA DISH GREEN POLKADOT        3 04/12/11 12:32  0.19
## 503498 580469      PARTY PIZZA DISH BLUE POLKADOT        3 04/12/11 12:32  0.19
## 503499 580469      PARTY PIZZA DISH PINK POLKADOT        3 04/12/11 12:32  0.19
## 503528 580469             LUNCH BAG  BLACK SKULL.        2 04/12/11 12:32  1.65
## 503545 580469                PING MICROWAVE APRON        1 04/12/11 12:32  0.79
## 503556 580469           LUNCH BAG SPACEBOY DESIGN        1 04/12/11 12:32  1.65
## 503557 580469             LUNCH BAG  BLACK SKULL.        1 04/12/11 12:32  1.65
## 503563 580469 SET OF 10 LANTERNS FAIRY LIGHT STAR        1 04/12/11 12:32  4.15
## 503564 580469   STRAWBERRY LUNCH BOX WITH CUTLERY        1 04/12/11 12:32  2.55
## 503578 580469           RIBBON REEL HEARTS DESIGN        2 04/12/11 12:32  1.65
## 503739 580501             RED SPOT GIFT BAG LARGE        2 04/12/11 13:00  1.25
## 503754 580501       SILVER STARS TABLE DECORATION        2 04/12/11 13:00  0.83
## 503901 580503 SET 4 VALENTINE DECOUPAGE HEART BOX        1 04/12/11 13:20  2.95
## 503935 580504            SNACK TRAY I LOVE LONDON        1 04/12/11 13:32  1.95
## 503941 580504            PLASTERS IN TIN SPACEBOY        1 04/12/11 13:32  1.65
## 503949 580504                  RABBIT NIGHT LIGHT        1 04/12/11 13:32  2.08
## 503958 580504               ROSE CARAVAN DOORSTOP        1 04/12/11 13:32  1.95
## 503979 580504           JUMBO BAG SPACEBOY DESIGN        1 04/12/11 13:32  2.08
## 504261 580515     TRAVEL CARD WALLET VINTAGE LEAF       24 04/12/11 14:09  0.42
## 504290 580516             PAPER BUNTING RETROSPOT        1 04/12/11 14:15  2.95
## 504292 580516          PAPER BUNTING PAISLEY PARK        1 04/12/11 14:15  2.95
## 504293 580516         PAPER BUNTING VINTAGE PARTY        1 04/12/11 14:15  2.95
## 504326 580516   GLITTER CHRISTMAS TREE WITH BELLS        6 04/12/11 14:15  0.79
## 504446 580520     60 CAKE CASES VINTAGE CHRISTMAS        1 04/12/11 14:55  0.55
## 504490 580520    SET OF 12 MINI LOAF BAKING CASES        1 04/12/11 14:55  0.83
## 504505 580520   MAGNETS PACK OF 4 HOME SWEET HOME        1 04/12/11 14:55  0.39
## 504520 580520            CLASSIC GLASS COOKIE JAR        1 04/12/11 14:55  4.15
## 504530 580520    SET OF 12 MINI LOAF BAKING CASES        1 04/12/11 14:55  0.83
## 504541 580520            36 FOIL HEART CAKE CASES        1 04/12/11 14:55  0.79
## 504548 580520    SET OF 12 MINI LOAF BAKING CASES        1 04/12/11 14:55  0.83
## 504559 580523      PAPER CHAIN KIT 50'S CHRISTMAS        1 04/12/11 15:00  2.95
## 504564 580523    ASSORTED COLOUR SUCTION CUP HOOK        1 04/12/11 15:00  0.19
## 504610 580523           HOT WATER BOTTLE SEX BOMB        1 04/12/11 15:00  1.65
## 504711 580527      HAND OVER THE CHOCOLATE   SIGN        1 04/12/11 15:19  2.10
## 505561 580611        WHITE SKULL HOT WATER BOTTLE        1 05/12/11 11:49  4.25
## 505562 580611               LOVE HOT WATER BOTTLE        1 05/12/11 11:49  5.95
## 505565 580611             LUNCH BAG  BLACK SKULL.        1 05/12/11 11:49  1.65
## 505575 580611                  DOUGHNUT LIP GLOSS       20 05/12/11 11:49  1.25
## 505593 580611                     JUMBO BAG PEARS        1 05/12/11 11:49  2.08
## 505606 580611          FLORAL FOLK STATIONERY SET        1 05/12/11 11:49  1.25
## 505627 580611   KEY RING BASEBALL BOOT UNION JACK        1 05/12/11 11:49  1.25
## 506028 580619          BISCUIT TIN 50'S CHRISTMAS        1 05/12/11 12:08  2.89
## 506045 580619        REX CASH+CARRY JUMBO SHOPPER        1 05/12/11 12:08  0.95
## 506084 580632  PACK OF 60 PINK PAISLEY CAKE CASES        1 05/12/11 12:16  0.55
## 506127 580632        SMALL HEART MEASURING SPOONS        1 05/12/11 12:16  0.85
## 506315 580635    SET OF 3 WOODEN TREE DECORATIONS        1 05/12/11 12:30  1.25
## 506322 580635   SET OF 3 WOODEN HEART DECORATIONS        1 05/12/11 12:30  1.25
## 506323 580635    SET OF 3 WOODEN TREE DECORATIONS        1 05/12/11 12:30  1.25
## 506340 580635    SET OF 2 TINS JARDIN DE PROVENCE        1 05/12/11 12:30  1.25
## 506345 580635     MAKE YOUR OWN PLAYTIME CARD KIT        1 05/12/11 12:30  0.79
## 506346 580635      MAKE YOUR OWN MONSOON CARD KIT        1 05/12/11 12:30  0.79
## 506524 580640     60 CAKE CASES VINTAGE CHRISTMAS        1 05/12/11 12:51  0.55
## 506525 580640      72 SWEETHEART FAIRY CAKE CASES        1 05/12/11 12:51  0.55
## 506832 580654           MAGIC TREE -PAPER FLOWERS        1 05/12/11 13:37  0.85
## 506844 580654                FEATHER PEN,HOT PINK       12 05/12/11 13:37  0.39
## 506902 580659              HAND WARMER OWL DESIGN        2 05/12/11 13:46  2.10
## 507062 580667             NINE DRAWER OFFICE TIDY        1 05/12/11 14:19 14.95
## 507368 580677         3 ROSE MORRIS BOXED CANDLES        1 05/12/11 14:40  1.25
## 507381 580677    WHITE ROCKING HORSE HAND PAINTED        1 05/12/11 14:40  1.25
## 507399 580677       DECORATIVE WICKER HEART LARGE        1 05/12/11 14:40  1.65
## 507402 580677       DECORATIVE WICKER HEART LARGE        1 05/12/11 14:40  1.65
## 507416 580677         60 TEATIME FAIRY CAKE CASES        1 05/12/11 14:40  0.55
## 507427 580677        HANGING ENGRAVED METAL HEART        1 05/12/11 14:40  4.15
## 507467 580677  PLAYING CARDS KEEP CALM & CARRY ON        1 05/12/11 14:40  1.25
## 507779 580695       SET OF 3 CAKE TINS SKETCHBOOK        1 05/12/11 16:03  1.95
## 507792 580695     TRADITIONAL PICK UP STICKS GAME        1 05/12/11 16:03  1.25
## 507811 580695                   WHITE WICKER STAR        1 05/12/11 16:03  2.10
## 507817 580695    RED RETROSPOT TEA CUP AND SAUCER        1 05/12/11 16:03  1.25
## 507885 580697     SET OF 4 ROSE BOTANICAL CANDLES       12 05/12/11 16:05  1.25
## 507902 580697       SET OF 4 NAPKIN CHARMS LEAVES        1 05/12/11 16:05  0.79
## 508027 580720          HAND WARMER RED LOVE HEART        1 05/12/11 16:55  2.10
## 510097 580731             SET OF 6 T-LIGHTS SANTA        1 05/12/11 17:36  2.95
## 510117 580731           SET OF 6 T-LIGHTS SNOWMEN        1 05/12/11 17:36  2.95
## 510760 580822                CARD MOTORBIKE SANTA       12 06/12/11 11:33  0.42
## 510763 580822        CHRISTMAS CARD SINGING ANGEL       12 06/12/11 11:33  0.42
## 510905 580848       TRADTIONAL ALPHABET STAMP SET        1 06/12/11 11:51  4.95
## 510910 580848         ROCKING HORSE RED CHRISTMAS        1 06/12/11 11:51  0.85
## 510912 580848       GARLAND WITH HEARTS AND BELLS        1 06/12/11 11:51  4.95
## 510916 580848                  VINTAGE SNAP CARDS        1 06/12/11 11:51  0.85
## 510917 580848           SET OF 6 SOLDIER SKITTLES        1 06/12/11 11:51  3.75
## 510950 580865      PINK CRYSTAL SKULL PHONE CHARM       12 06/12/11 11:58  0.19
## 510977 580865 CERAMIC HEART FAIRY CAKE MONEY BANK        1 06/12/11 11:58  0.39
## 510991 580865          HAND WARMER RED LOVE HEART        1 06/12/11 11:58  2.10
## 511000 580865    TRADITIONAL WOODEN SKIPPING ROPE        1 06/12/11 11:58  1.45
## 511008 580865      SET OF 6 3D KIT CARDS FOR KIDS        1 06/12/11 11:58  0.85
## 511226 580877 ROTATING SILVER ANGELS T-LIGHT HLDR        1 06/12/11 12:15  2.55
## 511424 580884           NOEL WOODEN BLOCK LETTERS        1 06/12/11 12:21  5.95
## 511430 580884        GIANT 50'S CHRISTMAS CRACKER        1 06/12/11 12:21  1.25
## 511448 580884               BOOM BOX SPEAKER BOYS        2 06/12/11 12:21  1.25
## 511449 580884   KEY RING BASEBALL BOOT UNION JACK        1 06/12/11 12:21  1.25
## 511453 580884     SET OF 4 ROSE BOTANICAL CANDLES        1 06/12/11 12:21  1.25
## 511458 580884          PEACE WOODEN BLOCK LETTERS        2 06/12/11 12:21  1.95
## 511460 580884        AIRLINE BAG VINTAGE TOKYO 78        1 06/12/11 12:21  4.25
## 511463 580884         SEWING BOX RETROSPOT DESIGN        1 06/12/11 12:21  3.95
## 511464 580884     AIRLINE BAG VINTAGE JET SET RED        2 06/12/11 12:21  4.25
## 511549 580893           DANISH ROSE TRINKET TRAYS        2 06/12/11 12:38  0.79
## 511558 580893              TOAST ITS - I LOVE YOU        1 06/12/11 12:38  1.25
## 511568 580893    SET OF 2 TINS JARDIN DE PROVENCE        1 06/12/11 12:38  1.25
## 511570 580893         SEWING BOX RETROSPOT DESIGN        1 06/12/11 12:38  3.95
## 511616 580903      BLUE  DIAMANTE PEN IN GIFT BOX        1 06/12/11 12:56  4.95
## 511627 580903    SET 12 KIDS COLOUR  CHALK STICKS        1 06/12/11 12:56  0.42
## 511651 580903                IVORY KITCHEN SCALES        1 06/12/11 12:56  8.50
## 511753 580908     60 CAKE CASES VINTAGE CHRISTMAS        1 06/12/11 13:20  0.55
## 511761 580908     RETROSPOT TEA SET CERAMIC 11 PC        1 06/12/11 13:20  4.95
## 511765 580908     CHILDRENS APRON SPACEBOY DESIGN        1 06/12/11 13:20  1.95
## 511781 580908     RETROSPOT TEA SET CERAMIC 11 PC        1 06/12/11 13:20  4.95
## 511787 580908     CHILDRENS APRON SPACEBOY DESIGN        1 06/12/11 13:20  1.95
## 511789 580908     CHILDS BREAKFAST SET DOLLY GIRL        1 06/12/11 13:20  9.95
## 511791 580908           FELTCRAFT GIRL NICOLE KIT        1 06/12/11 13:20  4.95
## 511792 580908            3 STRIPEY MICE FELTCRAFT        1 06/12/11 13:20  1.95
## 511794 580908     RETROSPOT TEA SET CERAMIC 11 PC        1 06/12/11 13:20  4.95
## 511863 580914        BUNDLE OF 3 RETRO NOTE BOOKS        1 06/12/11 13:42  1.65
## 512159 580958           IVORY WICKER HEART MEDIUM        1 06/12/11 14:30  1.25
## 512172 580958                  RABBIT NIGHT LIGHT        1 06/12/11 14:30  2.08
## 512178 580958            GOLD EAR MUFF HEADPHONES        1 06/12/11 14:30  1.95
## 512180 580958                  RABBIT NIGHT LIGHT        1 06/12/11 14:30  2.08
## 512181 580958            GOLD EAR MUFF HEADPHONES        1 06/12/11 14:30  1.95
## 512195 580958          GYMKHANA TREASURE BOOK BOX        1 06/12/11 14:30  2.25
## 512196 580958                   DOLLY GIRL BEAKER        2 06/12/11 14:30  1.25
## 512482 580982          MAGIC DRAWING SLATE PURDEY        1 06/12/11 16:21  0.42
## 512485 580982          MAGIC DRAWING SLATE PURDEY        1 06/12/11 16:21  0.42
## 513347 580998                 DOORMAT NEW ENGLAND        1 06/12/11 17:26  8.25
## 513389 580999             OVEN MITT APPLES DESIGN        2 06/12/11 17:49  1.45
## 513392 580999       CERAMIC STRAWBERRY DESIGN MUG        2 06/12/11 17:49  0.39
## 514149 581116             BLUE PAISLEY SKETCHBOOK        1 07/12/11 12:21  3.75
## 514278 581125          PAPER BUNTING PAISLEY PARK        1 07/12/11 12:41  2.95
## 514467 581134   SET OF 6 RIBBONS PERFECTLY PRETTY        1 07/12/11 13:12  2.89
## 514478 581134  3 RAFFIA RIBBONS VINTAGE CHRISTMAS        3 07/12/11 13:12  0.79
## 514480 581134      SET OF 6 RIBBONS COUNTRY STYLE        1 07/12/11 13:12  2.89
## 514493 581134            EASTER TREE YELLOW BIRDS        1 07/12/11 13:12  5.95
## 514501 581134         RETROSPOT CIGAR BOX MATCHES        1 07/12/11 13:12  0.39
## 514502 581134        12 HANGING EGGS HAND PAINTED        1 07/12/11 13:12  2.08
## 514503 581134        REX CASH+CARRY JUMBO SHOPPER        1 07/12/11 13:12  0.95
## 514576 581142   MAGNETS PACK OF 4 HOME SWEET HOME        1 07/12/11 13:38  0.39
## 514588 581142     12 MESSAGE CARDS WITH ENVELOPES        1 07/12/11 13:38  1.65
## 514589 581142          HAND WARMER RED LOVE HEART        2 07/12/11 13:38  2.10
## 514590 581142            SET OF 4 JAM JAR MAGNETS        1 07/12/11 13:38  2.08
## 514598 581142     MAGIC DRAWING SLATE BAKE A CAKE        5 07/12/11 13:38  0.42
## 514766 581147            IVORY WICKER HEART LARGE        5 07/12/11 14:01  1.65
## 514802 581149                  PIZZA PLATE IN BOX        1 07/12/11 14:12  1.25
## 514817 581149      12 RED ROSE PEG PLACE SETTINGS        2 07/12/11 14:12  1.25
## 514850 581149        WHITE MOROCCAN METAL LANTERN        1 07/12/11 14:12  3.75
## 514855 581149        SET OF 6 T-LIGHTS TOADSTOOLS        6 07/12/11 14:12  1.25
## 515003 581166     VINTAGE DOILY DELUXE SEWING KIT        1 07/12/11 14:43  5.95
## 515011 581166            STORAGE TIN VINTAGE LEAF        1 07/12/11 14:43  1.25
## 515025 581166        CHILDRENS CUTLERY DOLLY GIRL        1 07/12/11 14:43  4.15
## 515028 581166             TOADSTOOL BEDSIDE LIGHT        1 07/12/11 14:43  8.95
## 515029 581166            SET OF 4 JAM JAR MAGNETS        1 07/12/11 14:43  2.08
## 515031 581166   SET OF 6 SPICE TINS PANTRY DESIGN        1 07/12/11 14:43  3.95
## 515032 581166            JAM MAKING SET WITH JARS        3 07/12/11 14:43  4.25
## 515042 581166           STORAGE TIN VINTAGE DOILY        2 07/12/11 14:43  2.89
## 515043 581166     SET OF 4 KNICK KNACK TINS DOILY        1 07/12/11 14:43  4.15
## 515133 581173     DISCO BALL CHRISTMAS DECORATION       24 07/12/11 15:07  0.12
## 515149 581173        LARGE CIRCULAR MIRROR MOBILE        6 07/12/11 15:07  1.25
## 515163 581173                FEATHER PEN,HOT PINK       12 07/12/11 15:07  0.39
## 515469 581191       DECORATIVE WICKER HEART LARGE        1 07/12/11 16:56  1.65
## 517281 581237               CLASSIC BICYCLE CLIPS        1 08/12/11 10:40  1.45
## 517285 581237         CLASSIC CHROME BICYCLE BELL        1 08/12/11 10:40  1.45
## 517287 581237         MINI PLAYING CARDS FUN FAIR        2 08/12/11 10:40  0.42
## 517310 581237   PACK OF 12 50'S CHRISTMAS TISSUES        1 08/12/11 10:40  0.39
## 517620 581253               STOOL HOME SWEET HOME        1 08/12/11 11:15 12.50
## 517839 581310          PACK OF SIX LED TEA LIGHTS        1 08/12/11 11:43  2.89
## 518006 581334   CHARLIE+LOLA RED HOT WATER BOTTLE        1 08/12/11 12:07  1.25
## 518012 581334             SET 10 NIGHT OWL LIGHTS        1 08/12/11 12:07  6.75
## 518023 581334                TEA COSY RED  STRIPE        1 08/12/11 12:07  2.55
## 518068 581345           PLACE SETTING WHITE HEART       24 08/12/11 12:15  0.42
## 518088 581352      BLACK TEA TOWEL CLASSIC DESIGN        2 08/12/11 12:26  0.39
## 518090 581352          WOODEN FRAME ANTIQUE WHITE        1 08/12/11 12:26  2.95
## 518095 581352              ALPHABET STENCIL CRAFT        1 08/12/11 12:26  1.25
## 518561 581404               HEART OF WICKER SMALL        2 08/12/11 13:47  1.65
## 518643 581405    SET OF 2 TINS JARDIN DE PROVENCE        1 08/12/11 13:50  1.25
## 518733 581405 12 PENCILS SMALL TUBE RED RETROSPOT        1 08/12/11 13:50  0.65
## 518761 581405   HEART WREATH DECORATION WITH BELL        1 08/12/11 13:50  1.25
## 518880 581412          FAWN BLUE HOT WATER BOTTLE        1 08/12/11 14:38  3.75
## 518931 581412            FRYING PAN RED RETROSPOT        1 08/12/11 14:38  1.25
## 519005 581414  ROUND SNACK BOXES SET OF4 WOODLAND        1 08/12/11 14:39  2.95
## 519010 581414            RED RETROSPOT TISSUE BOX        1 08/12/11 14:39  0.39
## 519016 581414             RECYCLING BAG RETROSPOT        1 08/12/11 14:39  2.10
## 519025 581414            DOLLY GIRL CHILDRENS CUP        1 08/12/11 14:39  1.25
## 519030 581414   ROUND SNACK BOXES SET OF 4 SKULLS        1 08/12/11 14:39  2.95
## 519035 581414   ROUND SNACK BOXES SET OF 4 SKULLS        1 08/12/11 14:39  2.95
## 519039 581414           THREE MINI HANGING FRAMES        1 08/12/11 14:39  4.15
## 519196 581425      HAND OVER THE CHOCOLATE   SIGN       12 08/12/11 15:31  2.10
## 519209 581425      SWEETHEART CERAMIC TRINKET BOX        4 08/12/11 15:31  1.25
## 519224 581425                    JAM CLOCK MAGNET        1 08/12/11 15:31  1.25
## 520074 581449            REGENCY CAKESTAND 3 TIER        1 08/12/11 17:37 12.75
## 520108 581450            JOY WOODEN BLOCK LETTERS        1 08/12/11 17:54  1.25
## 520214 581456               FOLKART CLIP ON STARS        2 08/12/11 18:42  0.39
## 520361 581471         GINGHAM HEART  DOORSTOP RED        2 08/12/11 19:29  1.95
## 521770 581514         6 RIBBONS ELEGANT CHRISTMAS       24 09/12/11 11:20  0.39
## 521814 581538    SET OF 3 HANGING OWLS OLLIE BEAK        1 09/12/11 11:34  1.25
## 521834 581538         BLACK PIRATE TREASURE CHEST        1 09/12/11 11:34  0.39
## 521848 581538      BOX OF 6 MINI VINTAGE CRACKERS        1 09/12/11 11:34  2.49
## 521851 581538               REVOLVER WOODEN RULER        1 09/12/11 11:34  1.95
## 521858 581538                         WICKER STAR        1 09/12/11 11:34  2.10
## 521860 581538         JUMBO BAG VINTAGE CHRISTMAS        1 09/12/11 11:34  2.08
##        CustomerID        Country
## 509         17908 United Kingdom
## 519         17908 United Kingdom
## 529         17908 United Kingdom
## 531         17908 United Kingdom
## 547         17920 United Kingdom
## 579         17920 United Kingdom
## 581         17920 United Kingdom
## 586         17920 United Kingdom
## 590         17920 United Kingdom
## 592         17920 United Kingdom
## 593         17920 United Kingdom
## 596         17920 United Kingdom
## 597         17920 United Kingdom
## 608         17920 United Kingdom
## 609         17920 United Kingdom
## 610         17920 United Kingdom
## 612         17920 United Kingdom
## 750         15983 United Kingdom
## 823         17968 United Kingdom
## 827         17968 United Kingdom
## 844         17968 United Kingdom
## 851         17968 United Kingdom
## 883         17897 United Kingdom
## 1052        15012 United Kingdom
## 1058        15012 United Kingdom
## 1131        15525 United Kingdom
## 1144        15525 United Kingdom
## 1150        15525 United Kingdom
## 1156        15525 United Kingdom
## 1157        15525 United Kingdom
## 1158        15525 United Kingdom
## 1160        15525 United Kingdom
## 1163        15525 United Kingdom
## 1170        15525 United Kingdom
## 1196        17905 United Kingdom
## 1213        15485 United Kingdom
## 1719           NA United Kingdom
## 1956        17346 United Kingdom
## 1969        17346 United Kingdom
## 1973        17346 United Kingdom
## 1974        17346 United Kingdom
## 2039        17841 United Kingdom
## 2060        17873 United Kingdom
## 2149        16274 United Kingdom
## 2167        16274 United Kingdom
## 2887           NA United Kingdom
## 3492        18041 United Kingdom
## 3504        18041 United Kingdom
## 3522        18041 United Kingdom
## 3540        18041 United Kingdom
## 3541        18041 United Kingdom
## 3546        18041 United Kingdom
## 3547        18041 United Kingdom
## 3552        18041 United Kingdom
## 3951        16916 United Kingdom
## 4068        17976 United Kingdom
## 4069        17976 United Kingdom
## 4080        17976 United Kingdom
## 4089        17976 United Kingdom
## 4092        17976 United Kingdom
## 4094        17976 United Kingdom
## 4103        17976 United Kingdom
## 4105        17976 United Kingdom
## 4541        15574 United Kingdom
## 4544        15574 United Kingdom
## 4570        15574 United Kingdom
## 4575        15574 United Kingdom
## 4576        15574 United Kingdom
## 4581        15574 United Kingdom
## 4582        15574 United Kingdom
## 4584        15574 United Kingdom
## 4585        15574 United Kingdom
## 4591        15574 United Kingdom
## 4601        15574 United Kingdom
## 4602        15574 United Kingdom
## 4606        15574 United Kingdom
## 4615        15574 United Kingdom
## 4618        15574 United Kingdom
## 4630        15574 United Kingdom
## 4659        17838 United Kingdom
## 4663        17838 United Kingdom
## 5080        14573 United Kingdom
## 5082        14573 United Kingdom
## 5111        14573 United Kingdom
## 5113        14573 United Kingdom
## 5119        14573 United Kingdom
## 5122        14573 United Kingdom
## 5359        17967 United Kingdom
## 5380        17967 United Kingdom
## 5386        17967 United Kingdom
## 5388        17967 United Kingdom
## 5390        17967 United Kingdom
## 5391        17967 United Kingdom
## 5604        16891 United Kingdom
## 5616        16891 United Kingdom
## 5625        16891 United Kingdom
## 5628        16891 United Kingdom
## 5631        16891 United Kingdom
## 5642        16891 United Kingdom
## 6320        14083 United Kingdom
## 6333        14083 United Kingdom
## 6355        14083 United Kingdom
## 6358        14083 United Kingdom
## 6623        14723 United Kingdom
## 7300        13838 United Kingdom
## 7302        13838 United Kingdom
## 7326        13838 United Kingdom
## 7358        15038 United Kingdom
## 7375        15038 United Kingdom
## 7376        15038 United Kingdom
## 7521        15708 United Kingdom
## 7523        15708 United Kingdom
## 7530        15708 United Kingdom
## 7531        15708 United Kingdom
## 7540        15708 United Kingdom
## 7675        14813 United Kingdom
## 7840        14810 United Kingdom
## 7960        18118 United Kingdom
## 8056        15716 United Kingdom
## 8097        18156 United Kingdom
## 8115        18156 United Kingdom
## 8117        18156 United Kingdom
## 8118        18156 United Kingdom
## 8119        18156 United Kingdom
## 8272        12748 United Kingdom
## 8276        12748 United Kingdom
## 8280        12748 United Kingdom
## 8416        12748 United Kingdom
## 8423        12748 United Kingdom
## 8424        12748 United Kingdom
## 8526        15880 United Kingdom
## 8540        15880 United Kingdom
## 8556        15880 United Kingdom
## 8563        15880 United Kingdom
## 8564        15880 United Kingdom
## 8565        15880 United Kingdom
## 8569        15880 United Kingdom
## 8570        15880 United Kingdom
## 8579        15880 United Kingdom
## 8630        16718 United Kingdom
## 8654        15808 United Kingdom
## 8656        15808 United Kingdom
## 8659        15808 United Kingdom
## 8661        15808 United Kingdom
## 8686        15808 United Kingdom
## 8687        15808 United Kingdom
## 8688        15808 United Kingdom
## 8690        15808 United Kingdom
## 8697        15808 United Kingdom
## 8713        12748 United Kingdom
## 8715        12748 United Kingdom
## 8716        12748 United Kingdom
## 8748        17858 United Kingdom
## 8749        17858 United Kingdom
## 8847        16411 United Kingdom
## 8904        16402 United Kingdom
## 8909        16402 United Kingdom
## 8921        16402 United Kingdom
## 8928        15023 United Kingdom
## 8940        15023 United Kingdom
## 8957        15023 United Kingdom
## 8980        15311 United Kingdom
## 9022        15426 United Kingdom
## 9023        15426 United Kingdom
## 9026        15426 United Kingdom
## 9030        15426 United Kingdom
## 9037        15426 United Kingdom
## 9043        15426 United Kingdom
## 9051        15426 United Kingdom
## 9054        15426 United Kingdom
## 9064        15426 United Kingdom
## 9082        15426 United Kingdom
## 9119        15894 United Kingdom
## 9124        15894 United Kingdom
## 9127        15894 United Kingdom
## 9137        15894 United Kingdom
## 9150        15867 United Kingdom
## 9259        14506 United Kingdom
## 9268        14506 United Kingdom
## 9272        14506 United Kingdom
## 9280        14506 United Kingdom
## 9285        14506 United Kingdom
## 9361        15889 United Kingdom
## 9388        15889 United Kingdom
## 9409        15889 United Kingdom
## 9418        15889 United Kingdom
## 9419        15889 United Kingdom
## 9421        15889 United Kingdom
## 9422        15889 United Kingdom
## 9481        15953 United Kingdom
## 9691        14404 United Kingdom
## 9708        13174 United Kingdom
## 9720        13174 United Kingdom
## 9725        13174 United Kingdom
## 9731        13174 United Kingdom
## 9732        13174 United Kingdom
## 9743        13174 United Kingdom
## 9762        13174 United Kingdom
## 9795        13174 United Kingdom
## 9821        13174 United Kingdom
## 9825        13174 United Kingdom
## 9828        13174 United Kingdom
## 9830        13174 United Kingdom
## 9831        13174 United Kingdom
## 9852        13174 United Kingdom
## 9857        13174 United Kingdom
## 9866        13174 United Kingdom
## 9870        13174 United Kingdom
## 9888        12748 United Kingdom
## 11089          NA United Kingdom
## 11368       15898 United Kingdom
## 11377       15898 United Kingdom
## 11445       15039 United Kingdom
## 11459       15039 United Kingdom
## 11492       15919 United Kingdom
## 11515       15919 United Kingdom
## 11517       15919 United Kingdom
## 11518       15919 United Kingdom
## 11519       15919 United Kingdom
## 11523       15919 United Kingdom
## 11524       15919 United Kingdom
## 11526       15919 United Kingdom
## 11527       15919 United Kingdom
## 11531       15919 United Kingdom
## 11721       16898 United Kingdom
## 11723       16898 United Kingdom
## 11727       16898 United Kingdom
## 11820       17596 United Kingdom
## 11884       17860 United Kingdom
## 11889       17860 United Kingdom
## 11910       17860 United Kingdom
## 11919       17860 United Kingdom
## 11923       17860 United Kingdom
## 11928       17860 United Kingdom
## 12064       17259 United Kingdom
## 12077       17259 United Kingdom
## 12081       17259 United Kingdom
## 12092       17259 United Kingdom
## 12106       17259 United Kingdom
## 12249       16710 United Kingdom
## 12255       16710 United Kingdom
## 12260       16710 United Kingdom
## 12262       16710 United Kingdom
## 12472       15356 United Kingdom
## 12498       15356 United Kingdom
## 12501       15356 United Kingdom
## 12506       15356 United Kingdom
## 12589       13030 United Kingdom
## 12591       13030 United Kingdom
## 12603       13030 United Kingdom
## 12795       17884 United Kingdom
## 12849       17218 United Kingdom
## 12880       17218 United Kingdom
## 12895       17812 United Kingdom
## 12897       17812 United Kingdom
## 12899       17812 United Kingdom
## 12913       17812 United Kingdom
## 13712       13564 United Kingdom
## 14063          NA United Kingdom
## 14113       18119 United Kingdom
## 14195       13569 United Kingdom
## 14559       12748 United Kingdom
## 14608       12748 United Kingdom
## 15929       17591 United Kingdom
## 15930       17591 United Kingdom
## 15931       17591 United Kingdom
## 15937       17591 United Kingdom
## 15948       17591 United Kingdom
## 15957       17591 United Kingdom
## 15958       17591 United Kingdom
## 15969       17591 United Kingdom
## 15981       17591 United Kingdom
## 16036       17897 United Kingdom
## 16067       17897 United Kingdom
## 16068       17897 United Kingdom
## 17237       15021 United Kingdom
## 17240       15021 United Kingdom
## 17242       15021 United Kingdom
## 17249       15021 United Kingdom
## 17320       18043 United Kingdom
## 17327       18043 United Kingdom
## 17333       18043 United Kingdom
## 17343       18043 United Kingdom
## 17391       16016 United Kingdom
## 17414       16016 United Kingdom
## 17417       16016 United Kingdom
## 17516       17341 United Kingdom
## 17521       17341 United Kingdom
## 17556       17341 United Kingdom
## 17560       17341 United Kingdom
## 17566       17341 United Kingdom
## 17572       17341 United Kingdom
## 17579       17341 United Kingdom
## 17590       17341 United Kingdom
## 17592       17341 United Kingdom
## 17597       17341 United Kingdom
## 17598       17341 United Kingdom
## 17599       17341 United Kingdom
## 17606       17341 United Kingdom
## 17607       17341 United Kingdom
## 17616       17341 United Kingdom
## 17618       17341 United Kingdom
## 17622       17341 United Kingdom
## 17624       17341 United Kingdom
## 17625       17341 United Kingdom
## 17626       17341 United Kingdom
## 17630       17341 United Kingdom
## 17632       17341 United Kingdom
## 17633       17341 United Kingdom
## 17634       17341 United Kingdom
## 17636       17341 United Kingdom
## 17665       16385 United Kingdom
## 17669       16385 United Kingdom
## 18086          NA United Kingdom
## 18792       13140 United Kingdom
## 19548       16782 United Kingdom
## 19557       16782 United Kingdom
## 19558       16782 United Kingdom
## 19560       16782 United Kingdom
## 19729       17062 United Kingdom
## 19848       16065 United Kingdom
## 19946       18041 United Kingdom
## 20718          NA United Kingdom
## 21693       16907 United Kingdom
## 21815       17965 United Kingdom
## 21862       14702 United Kingdom
## 22026       12471        Germany
## 22610       17827 United Kingdom
## 22886       17912 United Kingdom
## 22913       15723 United Kingdom
## 22919       15723 United Kingdom
## 22937       15723 United Kingdom
## 22956       14667 United Kingdom
## 23017       12748 United Kingdom
## 23018       12748 United Kingdom
## 23065       12748 United Kingdom
## 23421       14667 United Kingdom
## 23469       16727 United Kingdom
## 23483       16727 United Kingdom
## 23522       15514 United Kingdom
## 23524       15514 United Kingdom
## 23525       15514 United Kingdom
## 23526       15514 United Kingdom
## 23527       15514 United Kingdom
## 23528       15514 United Kingdom
## 23531       15514 United Kingdom
## 23537       15514 United Kingdom
## 23541       15514 United Kingdom
## 24637       17243 United Kingdom
## 24695       15503 United Kingdom
## 24721       15503 United Kingdom
## 24724       15503 United Kingdom
## 24731       15503 United Kingdom
## 24774       17251 United Kingdom
## 24787       17251 United Kingdom
## 24885       15570 United Kingdom
## 24887       15570 United Kingdom
## 24888       15570 United Kingdom
## 24889       15570 United Kingdom
## 24925       14159 United Kingdom
## 24989       17126 United Kingdom
## 25004       17126 United Kingdom
## 25005       17126 United Kingdom
## 25006       17126 United Kingdom
## 25007       17126 United Kingdom
## 25008       17126 United Kingdom
## 25009       17126 United Kingdom
## 25015       17126 United Kingdom
## 25018       17126 United Kingdom
## 25203       17372 United Kingdom
## 25223       16367 United Kingdom
## 25243       16367 United Kingdom
## 25245       16367 United Kingdom
## 25269       17917 United Kingdom
## 25340       17085 United Kingdom
## 25429       13715 United Kingdom
## 25491       16011 United Kingdom
## 25686       14413 United Kingdom
## 25703       18004 United Kingdom
## 25707       18004 United Kingdom
## 25730       18004 United Kingdom
## 25817       15044 United Kingdom
## 25818       15044 United Kingdom
## 25819       15044 United Kingdom
## 25820       15044 United Kingdom
## 25821       15044 United Kingdom
## 25822       15044 United Kingdom
## 25823       15044 United Kingdom
## 25840       15044 United Kingdom
## 25887       17618 United Kingdom
## 25895       17618 United Kingdom
## 25897       17618 United Kingdom
## 25900       17618 United Kingdom
## 25902       17618 United Kingdom
## 25904       17618 United Kingdom
## 25905       17618 United Kingdom
## 25906       17618 United Kingdom
## 25907       17618 United Kingdom
## 25908       17618 United Kingdom
## 25909       17618 United Kingdom
## 25958       14505 United Kingdom
## 25985       14505 United Kingdom
## 25995       14505 United Kingdom
## 26040       14505 United Kingdom
## 27359       14544 United Kingdom
## 27366       14544 United Kingdom
## 27376       14544 United Kingdom
## 27622       14085 United Kingdom
## 27964       17890 United Kingdom
## 27970       17890 United Kingdom
## 28056       17371 United Kingdom
## 28405       17894 United Kingdom
## 28444       16442 United Kingdom
## 28459       16442 United Kingdom
## 28564       15356 United Kingdom
## 28588       15356 United Kingdom
## 28590       15356 United Kingdom
## 28591       15356 United Kingdom
## 28595       15356 United Kingdom
## 28596       15356 United Kingdom
## 28606       15356 United Kingdom
## 28874       14871 United Kingdom
## 28875       14871 United Kingdom
## 28876       14871 United Kingdom
## 28880       14871 United Kingdom
## 28987       14298 United Kingdom
## 29150       14606 United Kingdom
## 29166       14606 United Kingdom
## 29200       16033 United Kingdom
## 29259       14415 United Kingdom
## 29280       14415 United Kingdom
## 29302       14415 United Kingdom
## 29309       14415 United Kingdom
## 29312       14415 United Kingdom
## 29492       15311 United Kingdom
## 30545       16782 United Kingdom
## 30562       16782 United Kingdom
## 30574       16782 United Kingdom
## 31021       17551 United Kingdom
## 31022       17551 United Kingdom
## 31044       17551 United Kingdom
## 31045       17551 United Kingdom
## 31118       15641 United Kingdom
## 31231       15456 United Kingdom
## 31305       15727 United Kingdom
## 31471       16725 United Kingdom
## 31488       16725 United Kingdom
## 31555       17189 United Kingdom
## 31691       15482 United Kingdom
## 31925       12748 United Kingdom
## 32371          NA United Kingdom
## 32848       15532 United Kingdom
## 33048       14643 United Kingdom
## 33129       17392 United Kingdom
## 33134       17392 United Kingdom
## 33136       17392 United Kingdom
## 33138       17392 United Kingdom
## 33142       17392 United Kingdom
## 33149       17392 United Kingdom
## 33184       14723 United Kingdom
## 33186       14723 United Kingdom
## 33188       14723 United Kingdom
## 33193       14723 United Kingdom
## 33200       14723 United Kingdom
## 33260       14985 United Kingdom
## 33262       14985 United Kingdom
## 33264       14985 United Kingdom
## 33268       14985 United Kingdom
## 33680       12431      Australia
## 36248       16885 United Kingdom
## 36254       16885 United Kingdom
## 36320       17243 United Kingdom
## 36495       14472 United Kingdom
## 36504       14472 United Kingdom
## 36506       14472 United Kingdom
## 36516       14472 United Kingdom
## 36520       14472 United Kingdom
## 36525       17358 United Kingdom
## 36568       15581 United Kingdom
## 36577       15581 United Kingdom
## 36620       16686 United Kingdom
## 36627       16686 United Kingdom
## 36630       16686 United Kingdom
## 36650       16686 United Kingdom
## 36654       16686 United Kingdom
## 36656       16686 United Kingdom
## 36753       15640 United Kingdom
## 36764       15640 United Kingdom
## 36790       15640 United Kingdom
## 36794       15640 United Kingdom
## 36804       15640 United Kingdom
## 38343       15460 United Kingdom
## 38361       15460 United Kingdom
## 38419       13564 United Kingdom
## 38437       13564 United Kingdom
## 38532       15034 United Kingdom
## 39052          NA United Kingdom
## 39287          NA United Kingdom
## 39565          NA United Kingdom
## 40279          NA United Kingdom
## 40365       15235 United Kingdom
## 41008          NA United Kingdom
## 41176       18116 United Kingdom
## 41177       18116 United Kingdom
## 41203       18116 United Kingdom
## 41316       17315 United Kingdom
## 41368       14606 United Kingdom
## 41562       17841 United Kingdom
## 41596       15039 United Kingdom
## 41612       15039 United Kingdom
## 41614       15039 United Kingdom
## 42056       14210 United Kingdom
## 42199       15164 United Kingdom
## 42250       16725 United Kingdom
## 42370       16241 United Kingdom
## 42742          NA United Kingdom
## 43446          NA United Kingdom
## 43698       15464 United Kingdom
## 43757       15464 United Kingdom
## 45728       13280 United Kingdom
## 45742       13280 United Kingdom
## 45748       13280 United Kingdom
## 47649       16923 United Kingdom
## 47651       16923 United Kingdom
## 47668       13162 United Kingdom
## 47770       17796 United Kingdom
## 47819       14800 United Kingdom
## 47878       14472 United Kingdom
## 47883       14472 United Kingdom
## 47894       14472 United Kingdom
## 47896       14472 United Kingdom
## 47923       17114 United Kingdom
## 47977       15708 United Kingdom
## 47978       15708 United Kingdom
## 47979       15708 United Kingdom
## 48034       16326 United Kingdom
## 48218       16735 United Kingdom
## 48221       16735 United Kingdom
## 48222       16735 United Kingdom
## 48227       16735 United Kingdom
## 48228       16735 United Kingdom
## 48229       16735 United Kingdom
## 48230       16735 United Kingdom
## 48231       16735 United Kingdom
## 48233       16735 United Kingdom
## 48636       13451 United Kingdom
## 48646       13451 United Kingdom
## 49754          NA United Kingdom
## 50129       17406 United Kingdom
## 50182       17406 United Kingdom
## 50555          NA United Kingdom
## 51110       14669 United Kingdom
## 51271       15518 United Kingdom
## 51432          NA United Kingdom
## 52029       16791 United Kingdom
## 52039       16791 United Kingdom
## 52040       16791 United Kingdom
## 52058       16791 United Kingdom
## 52917       14587 United Kingdom
## 52931       14587 United Kingdom
## 52932       14587 United Kingdom
## 52934       14587 United Kingdom
## 52945       14587 United Kingdom
## 52950       14587 United Kingdom
## 52952       14587 United Kingdom
## 52961       14587 United Kingdom
## 52962       14587 United Kingdom
## 53503          NA United Kingdom
## 53814       17364 United Kingdom
## 53821       17364 United Kingdom
## 53825       17364 United Kingdom
## 54509       14978 United Kingdom
## 54689       13246 United Kingdom
## 54922          NA United Kingdom
## 55818       18106 United Kingdom
## 55820       18106 United Kingdom
## 55981       15033 United Kingdom
## 56742       16746 United Kingdom
## 56759       16746 United Kingdom
## 56862       15535 United Kingdom
## 56880       15535 United Kingdom
## 56882       15535 United Kingdom
## 56894       12748 United Kingdom
## 56901       13700 United Kingdom
## 56909       13700 United Kingdom
## 56920       13700 United Kingdom
## 56927       15046 United Kingdom
## 56928       15046 United Kingdom
## 56974       17841 United Kingdom
## 57054       13634 United Kingdom
## 57055       13634 United Kingdom
## 57063       14404 United Kingdom
## 57072       14404 United Kingdom
## 57102       16059 United Kingdom
## 57110       18069 United Kingdom
## 57136       18069 United Kingdom
## 57163       18069 United Kingdom
## 57224       17064 United Kingdom
## 57256       17609 United Kingdom
## 57275       17609 United Kingdom
## 57312       17609 United Kingdom
## 57318       17609 United Kingdom
## 57338       15673 United Kingdom
## 57340       15673 United Kingdom
## 57341       15673 United Kingdom
## 57342       15673 United Kingdom
## 57343       15673 United Kingdom
## 57344       15673 United Kingdom
## 57355       15673 United Kingdom
## 57356       15673 United Kingdom
## 57357       15673 United Kingdom
## 57358       15673 United Kingdom
## 57359       15673 United Kingdom
## 57373       15673 United Kingdom
## 57374       15673 United Kingdom
## 57677       15296 United Kingdom
## 57735       17690 United Kingdom
## 57892       14667 United Kingdom
## 58258       18212 United Kingdom
## 58264       18212 United Kingdom
## 58281       18212 United Kingdom
## 58285       18212 United Kingdom
## 58286       18212 United Kingdom
## 58288       18212 United Kingdom
## 58289       18212 United Kingdom
## 58290       18212 United Kingdom
## 58295       18212 United Kingdom
## 59054          NA United Kingdom
## 60147       18118 United Kingdom
## 60264       15023 United Kingdom
## 60269       15023 United Kingdom
## 60273       15023 United Kingdom
## 60406          NA United Kingdom
## 60851       14415 United Kingdom
## 61047       17576 United Kingdom
## 61510       17708 United Kingdom
## 61614       15039 United Kingdom
## 61616       15039 United Kingdom
## 61826       12841 United Kingdom
## 61829       12841 United Kingdom
## 62526       14916 United Kingdom
## 62558       14606 United Kingdom
## 62683       17231 United Kingdom
## 62693       17231 United Kingdom
## 62699       17231 United Kingdom
## 62719       14572 United Kingdom
## 62725       14572 United Kingdom
## 62753       14572 United Kingdom
## 63027       17787 United Kingdom
## 63028       17787 United Kingdom
## 63049       17787 United Kingdom
## 63050       17787 United Kingdom
## 63058       17787 United Kingdom
## 63063       17787 United Kingdom
## 64059          NA United Kingdom
## 64415       17890 United Kingdom
## 65741       17889 United Kingdom
## 65776       12916 United Kingdom
## 65779       12916 United Kingdom
## 65803       12916 United Kingdom
## 65815       17769 United Kingdom
## 65893       13659 United Kingdom
## 66017       15167 United Kingdom
## 66024       15167 United Kingdom
## 66202       17611 United Kingdom
## 66235       13230 United Kingdom
## 66237       13230 United Kingdom
## 66245       13230 United Kingdom
## 66249       13230 United Kingdom
## 66348       18283 United Kingdom
## 66406       13742 United Kingdom
## 66419       13742 United Kingdom
## 66424       13742 United Kingdom
## 66428       13742 United Kingdom
## 66442       13742 United Kingdom
## 67184       15039 United Kingdom
## 67886          NA      Hong Kong
## 67887          NA      Hong Kong
## 67888          NA      Hong Kong
## 67889          NA      Hong Kong
## 67961       15052 United Kingdom
## 67962       15052 United Kingdom
## 68057       14130 United Kingdom
## 68597       15967 United Kingdom
## 68618       15967 United Kingdom
## 69062       12709        Germany
## 69082       16222 United Kingdom
## 69086       16222 United Kingdom
## 69089       16222 United Kingdom
## 69090       16222 United Kingdom
## 69091       16222 United Kingdom
## 69121       16222 United Kingdom
## 69144       16222 United Kingdom
## 69145       16222 United Kingdom
## 69162       16222 United Kingdom
## 69188       16222 United Kingdom
## 69189       16222 United Kingdom
## 69190       16222 United Kingdom
## 69191       16222 United Kingdom
## 69192       16222 United Kingdom
## 69193       16222 United Kingdom
## 69362       13168 United Kingdom
## 69364       13168 United Kingdom
## 69396       13168 United Kingdom
## 69850       14049 United Kingdom
## 69911       13837 United Kingdom
## 70073       17888 United Kingdom
## 70074       17888 United Kingdom
## 70190       16714 United Kingdom
## 70218       16714 United Kingdom
## 70219       16714 United Kingdom
## 70234       16714 United Kingdom
## 70236       16714 United Kingdom
## 70241       16714 United Kingdom
## 70315       17027 United Kingdom
## 70392       17786 United Kingdom
## 70396       17786 United Kingdom
## 70401       17786 United Kingdom
## 71318          NA United Kingdom
## 71551       14701 United Kingdom
## 71856       18125 United Kingdom
## 71868       18125 United Kingdom
## 71882       18125 United Kingdom
## 71883       18125 United Kingdom
## 71894       18125 United Kingdom
## 71932       13174 United Kingdom
## 71942       13174 United Kingdom
## 71971       13174 United Kingdom
## 71973       13174 United Kingdom
## 72043       15549 United Kingdom
## 72070       14541 United Kingdom
## 72071       14541 United Kingdom
## 72084       14541 United Kingdom
## 72085       14541 United Kingdom
## 72095       14541 United Kingdom
## 72096       14541 United Kingdom
## 72195       15311 United Kingdom
## 72237       14662 United Kingdom
## 72248       14662 United Kingdom
## 72288       17180 United Kingdom
## 72309       14702 United Kingdom
## 72316       14702 United Kingdom
## 72324       14702 United Kingdom
## 73169       13709 United Kingdom
## 73191       18016 United Kingdom
## 73449       15579 United Kingdom
## 73534       13148 United Kingdom
## 73541       13148 United Kingdom
## 73549       13148 United Kingdom
## 73550       13148 United Kingdom
## 73558       13148 United Kingdom
## 73586       16770 United Kingdom
## 73605       16770 United Kingdom
## 73702       15415 United Kingdom
## 73809       17463 United Kingdom
## 73852       17463 United Kingdom
## 73860       17463 United Kingdom
## 73868       17463 United Kingdom
## 73877       17463 United Kingdom
## 73911       14502 United Kingdom
## 73932       14502 United Kingdom
## 73973       13869 United Kingdom
## 75159       17619 United Kingdom
## 75197       17619 United Kingdom
## 75200       17619 United Kingdom
## 75397       15058 United Kingdom
## 75833       17884 United Kingdom
## 76040       14606 United Kingdom
## 76113          NA United Kingdom
## 76247       16515 United Kingdom
## 76565       16110 United Kingdom
## 76572       16110 United Kingdom
## 76587       16110 United Kingdom
## 76589       16110 United Kingdom
## 76623       16110 United Kingdom
## 77565       17975 United Kingdom
## 77911       16771 United Kingdom
## 78017       17841 United Kingdom
## 78025       17841 United Kingdom
## 78057       17223 United Kingdom
## 78125       17337 United Kingdom
## 78155       17337 United Kingdom
## 78203       17337 United Kingdom
## 78250       17337 United Kingdom
## 78255       17337 United Kingdom
## 78256       17337 United Kingdom
## 78267       17337 United Kingdom
## 78279       17337 United Kingdom
## 78301       17337 United Kingdom
## 78304       17337 United Kingdom
## 78306       17337 United Kingdom
## 78325       17337 United Kingdom
## 78327       17337 United Kingdom
## 78339       17337 United Kingdom
## 78341       17337 United Kingdom
## 78537       14044 United Kingdom
## 78794       14085 United Kingdom
## 78832       15719 United Kingdom
## 79279       13230 United Kingdom
## 79289       13230 United Kingdom
## 79859       13137 United Kingdom
## 79860       13137 United Kingdom
## 79866       13137 United Kingdom
## 79871       13137 United Kingdom
## 80139       14462 United Kingdom
## 80143       14462 United Kingdom
## 80168       14462 United Kingdom
## 80312       16725 United Kingdom
## 80532       16456 United Kingdom
## 80647       15808 United Kingdom
## 80655       15808 United Kingdom
## 80659       15808 United Kingdom
## 80661       15808 United Kingdom
## 80738       14606 United Kingdom
## 80934       13334 United Kingdom
## 81030       13334 United Kingdom
## 81075       16686 United Kingdom
## 81109       16686 United Kingdom
## 81110       16686 United Kingdom
## 81114       16686 United Kingdom
## 81197       18118 United Kingdom
## 81205       18118 United Kingdom
## 81215       18118 United Kingdom
## 82007       17859 United Kingdom
## 82016       17859 United Kingdom
## 83057       14415 United Kingdom
## 83629       17537 United Kingdom
## 83964          NA United Kingdom
## 84324       18168 United Kingdom
## 84534       15046 United Kingdom
## 84569       14081 United Kingdom
## 84611       14081 United Kingdom
## 84612       14081 United Kingdom
## 84620       16725 United Kingdom
## 84637       16725 United Kingdom
## 84651       14555 United Kingdom
## 84652       14555 United Kingdom
## 84848       14796 United Kingdom
## 85211       17677 United Kingdom
## 85633       17282 United Kingdom
## 85634       17282 United Kingdom
## 85664       17282 United Kingdom
## 85671       17282 United Kingdom
## 85684       17282 United Kingdom
## 85781       13742 United Kingdom
## 85792       17126 United Kingdom
## 85865       16434 United Kingdom
## 85887       17050 United Kingdom
## 86049       17472 United Kingdom
## 86069       17472 United Kingdom
## 86102       15640 United Kingdom
## 86129       17255 United Kingdom
## 86146       17841 United Kingdom
## 86606       17346 United Kingdom
## 86611       17346 United Kingdom
## 86996       17571 United Kingdom
## 87683       14701 United Kingdom
## 87697       14701 United Kingdom
## 87976       16431 United Kingdom
## 87977       16431 United Kingdom
## 87987       16431 United Kingdom
## 87988       16431 United Kingdom
## 87990       16431 United Kingdom
## 88098       14825 United Kingdom
## 88560       14530 United Kingdom
## 88682       15039 United Kingdom
## 88685       15039 United Kingdom
## 88786       15024 United Kingdom
## 88803       15356 United Kingdom
## 89093       13001 United Kingdom
## 89116       13001 United Kingdom
## 90332       16745 United Kingdom
## 90393       17954 United Kingdom
## 90764       17841 United Kingdom
## 90766       17841 United Kingdom
## 91158       13230 United Kingdom
## 91159       13230 United Kingdom
## 91167       13230 United Kingdom
## 91437       14057 United Kingdom
## 91648       16726 United Kingdom
## 91650       16726 United Kingdom
## 91652       16726 United Kingdom
## 91670       16726 United Kingdom
## 91688       16726 United Kingdom
## 92024       13246 United Kingdom
## 92042       16746 United Kingdom
## 92043       16746 United Kingdom
## 92050       16746 United Kingdom
## 92100       16466 United Kingdom
## 92168       17811 United Kingdom
## 92174       17811 United Kingdom
## 92175       17811 United Kingdom
## 92198       17811 United Kingdom
## 92202       17811 United Kingdom
## 92237       17811 United Kingdom
## 92341       13097 United Kingdom
## 92491       13744 United Kingdom
## 92492       13744 United Kingdom
## 92494       13744 United Kingdom
## 92495       13744 United Kingdom
## 92496       13744 United Kingdom
## 92497       13744 United Kingdom
## 92510       13744 United Kingdom
## 92525       13744 United Kingdom
## 92526       13744 United Kingdom
## 92551       17050 United Kingdom
## 92589       17050 United Kingdom
## 92614       12988 United Kingdom
## 92640       12988 United Kingdom
## 92645       12988 United Kingdom
## 92648       12988 United Kingdom
## 92653       12988 United Kingdom
## 92658       12988 United Kingdom
## 92659       12988 United Kingdom
## 92675       12988 United Kingdom
## 92688       12988 United Kingdom
## 92733       13168 United Kingdom
## 92752       13168 United Kingdom
## 92812       14502 United Kingdom
## 92823       14502 United Kingdom
## 93344       16980 United Kingdom
## 93354       16980 United Kingdom
## 93369       16980 United Kingdom
## 93373       16980 United Kingdom
## 93379       16980 United Kingdom
## 93381       16980 United Kingdom
## 93548       17338 United Kingdom
## 93656       17338 United Kingdom
## 93661       17338 United Kingdom
## 93751       16014 United Kingdom
## 93754       16014 United Kingdom
## 93775       16014 United Kingdom
## 93776       16014 United Kingdom
## 94235       16912 United Kingdom
## 94275       17994 United Kingdom
## 94854       16907 United Kingdom
## 94860       16907 United Kingdom
## 95218       13077 United Kingdom
## 95899       18041 United Kingdom
## 96484       14978 United Kingdom
## 98451       17472 United Kingdom
## 98459       17472 United Kingdom
## 98463       17472 United Kingdom
## 98468       17472 United Kingdom
## 98491       17472 United Kingdom
## 99496       14573 United Kingdom
## 99545       13684 United Kingdom
## 99577       17243 United Kingdom
## 99579       17243 United Kingdom
## 99581       17243 United Kingdom
## 99631       16407 United Kingdom
## 99654       15708 United Kingdom
## 99657       15708 United Kingdom
## 99677       15708 United Kingdom
## 99682       15708 United Kingdom
## 99703       15708 United Kingdom
## 99714       15708 United Kingdom
## 99844       17516 United Kingdom
## 99847       17516 United Kingdom
## 99869       14472 United Kingdom
## 99891       14472 United Kingdom
## 99998       14157 United Kingdom
## 100012      14157 United Kingdom
## 100067      15547 United Kingdom
## 100121      12748 United Kingdom
## 100137      12748 United Kingdom
## 100139      12748 United Kingdom
## 100218      13610 United Kingdom
## 100240      13610 United Kingdom
## 100242      13610 United Kingdom
## 100311      15996 United Kingdom
## 100316      15996 United Kingdom
## 100559      18283 United Kingdom
## 100696      15039 United Kingdom
## 100698      15039 United Kingdom
## 100701      15039 United Kingdom
## 100702      15039 United Kingdom
## 100713      15039 United Kingdom
## 100720      15039 United Kingdom
## 100895      16667 United Kingdom
## 101060      16339 United Kingdom
## 101062      16339 United Kingdom
## 101074      17027 United Kingdom
## 101094      17027 United Kingdom
## 101102      17027 United Kingdom
## 101300      14056 United Kingdom
## 101330      14056 United Kingdom
## 101350      14056 United Kingdom
## 101362      14056 United Kingdom
## 101364      14056 United Kingdom
## 101392      14056 United Kingdom
## 102367      14688 United Kingdom
## 102629      15456 United Kingdom
## 103106      15750 United Kingdom
## 103121      15984 United Kingdom
## 103125      15984 United Kingdom
## 103962      17576 United Kingdom
## 103989      13230 United Kingdom
## 104000      13230 United Kingdom
## 104002      13230 United Kingdom
## 104014      13230 United Kingdom
## 104615      18218 United Kingdom
## 104656      14524 United Kingdom
## 104666      14524 United Kingdom
## 105054      15005 United Kingdom
## 105562      14796 United Kingdom
## 105970      14670 United Kingdom
## 105994      14670 United Kingdom
## 106025      14670 United Kingdom
## 106039      14670 United Kingdom
## 106055      14670 United Kingdom
## 106060      14670 United Kingdom
## 106073      14670 United Kingdom
## 106074      14670 United Kingdom
## 106078      14670 United Kingdom
## 106441      17243 United Kingdom
## 106604      14903 United Kingdom
## 106605      14903 United Kingdom
## 106655      14499 United Kingdom
## 106660      14499 United Kingdom
## 106704      17769 United Kingdom
## 106808      16033 United Kingdom
## 107030      17050 United Kingdom
## 107083      15696 United Kingdom
## 107768      15039 United Kingdom
## 107769      15039 United Kingdom
## 108050      17634 United Kingdom
## 108131      14606 United Kingdom
## 108132      14606 United Kingdom
## 108133      14606 United Kingdom
## 108422      15752 United Kingdom
## 108717         NA United Kingdom
## 109012      15834 United Kingdom
## 109051      15834 United Kingdom
## 109107      15834 United Kingdom
## 109127      15834 United Kingdom
## 109659      13975 United Kingdom
## 109690      13975 United Kingdom
## 109766      14730 United Kingdom
## 109769      14730 United Kingdom
## 109772      14730 United Kingdom
## 109773      14730 United Kingdom
## 109774      14730 United Kingdom
## 109890      15023 United Kingdom
## 109891      15023 United Kingdom
## 110155      16712 United Kingdom
## 111031      17864 United Kingdom
## 111194      14662 United Kingdom
## 111206      14662 United Kingdom
## 111210      14662 United Kingdom
## 111251      17238 United Kingdom
## 111266      17238 United Kingdom
## 111268      17238 United Kingdom
## 111324      15529 United Kingdom
## 111358      14165 United Kingdom
## 112537      17841 United Kingdom
## 113495      14587 United Kingdom
## 113739         NA United Kingdom
## 113903      16693 United Kingdom
## 113986      15547 United Kingdom
## 114091      13956 United Kingdom
## 114097      13956 United Kingdom
## 114148      13708 United Kingdom
## 114155      13708 United Kingdom
## 114255      17611 United Kingdom
## 114256      17611 United Kingdom
## 114257      17611 United Kingdom
## 114258      17611 United Kingdom
## 114280      17611 United Kingdom
## 114301      17611 United Kingdom
## 114593      18118 United Kingdom
## 114630      18118 United Kingdom
## 114691      15493 United Kingdom
## 114694      15493 United Kingdom
## 114695      15493 United Kingdom
## 114789      16005 United Kingdom
## 114810      16005 United Kingdom
## 114811      16005 United Kingdom
## 114812      16005 United Kingdom
## 114817      16005 United Kingdom
## 114820      16005 United Kingdom
## 114821      16005 United Kingdom
## 114826      16005 United Kingdom
## 114833      16005 United Kingdom
## 114834      16005 United Kingdom
## 114930      15311 United Kingdom
## 115166      13263 United Kingdom
## 115421      18260 United Kingdom
## 115484      17954 United Kingdom
## 115583      16392 United Kingdom
## 115585      16392 United Kingdom
## 116292      14226 United Kingdom
## 116405      13451 United Kingdom
## 116717      13089 United Kingdom
## 116718      13089 United Kingdom
## 116719      13089 United Kingdom
## 116835      12849 United Kingdom
## 116861      12849 United Kingdom
## 117208      14505 United Kingdom
## 117227      14505 United Kingdom
## 117264      14505 United Kingdom
## 117298      14505 United Kingdom
## 117623      13533 United Kingdom
## 117678      13623 United Kingdom
## 117743      13268 United Kingdom
## 117958      14462 United Kingdom
## 117968      14462 United Kingdom
## 117973      14462 United Kingdom
## 119143      15648 United Kingdom
## 119226      15861 United Kingdom
## 119266      15861 United Kingdom
## 119559      16511 United Kingdom
## 119584      16511 United Kingdom
## 119600      16511 United Kingdom
## 119603      16511 United Kingdom
## 119625      17673 United Kingdom
## 119628      17673 United Kingdom
## 119639      17673 United Kingdom
## 119651      17673 United Kingdom
## 119657      17673 United Kingdom
## 119658      17673 United Kingdom
## 119659      17673 United Kingdom
## 119669      17673 United Kingdom
## 119670      17673 United Kingdom
## 120017      15483 United Kingdom
## 120030      15483 United Kingdom
## 120124      15019 United Kingdom
## 120152      15019 United Kingdom
## 120156      15019 United Kingdom
## 120158      15019 United Kingdom
## 120326      17921 United Kingdom
## 120591      13046 United Kingdom
## 120639      13593 United Kingdom
## 121004      13725 United Kingdom
## 121023      17134 United Kingdom
## 121047      17795 United Kingdom
## 121299      14769 United Kingdom
## 121301      14769 United Kingdom
## 121307      14769 United Kingdom
## 121363      14769 United Kingdom
## 121369      14769 United Kingdom
## 121376      14769 United Kingdom
## 121386      14769 United Kingdom
## 121389      14769 United Kingdom
## 121405      14769 United Kingdom
## 121407      14769 United Kingdom
## 121413      14769 United Kingdom
## 121439      14769 United Kingdom
## 121464      14769 United Kingdom
## 121702      16710 United Kingdom
## 121706      16710 United Kingdom
## 121722      16710 United Kingdom
## 121752      16115 United Kingdom
## 121764      16115 United Kingdom
## 121771      16115 United Kingdom
## 121772      16115 United Kingdom
## 121973      15452 United Kingdom
## 121985      15452 United Kingdom
## 122463      15996 United Kingdom
## 122495      12637         France
## 122518      12637         France
## 122866      12867 United Kingdom
## 122906      12867 United Kingdom
## 122944         NA United Kingdom
## 123067      17231 United Kingdom
## 123781      14530 United Kingdom
## 123799      14530 United Kingdom
## 124047      15998 United Kingdom
## 124394      16374 United Kingdom
## 124424      16110 United Kingdom
## 124431      16110 United Kingdom
## 124447      16110 United Kingdom
## 124457      16110 United Kingdom
## 124461      16110 United Kingdom
## 124476      16110 United Kingdom
## 124480      16110 United Kingdom
## 125969      15021 United Kingdom
## 125970      15021 United Kingdom
## 125971      15021 United Kingdom
## 125972      15021 United Kingdom
## 125990      15021 United Kingdom
## 126006      15021 United Kingdom
## 126012      15021 United Kingdom
## 126035      15021 United Kingdom
## 126036      15021 United Kingdom
## 126037      15021 United Kingdom
## 126038      15021 United Kingdom
## 126039      15021 United Kingdom
## 126040      15021 United Kingdom
## 126041      15021 United Kingdom
## 126042      15021 United Kingdom
## 126048      15021 United Kingdom
## 127263      17059 United Kingdom
## 127280      16904 United Kingdom
## 127281      16904 United Kingdom
## 127283      16904 United Kingdom
## 127284      16904 United Kingdom
## 127285      16904 United Kingdom
## 127286      16904 United Kingdom
## 127293      16904 United Kingdom
## 127297      16904 United Kingdom
## 127310      16904 United Kingdom
## 127321      16904 United Kingdom
## 127323      16904 United Kingdom
## 127326      16904 United Kingdom
## 127327      16904 United Kingdom
## 127328      16904 United Kingdom
## 127340      16904 United Kingdom
## 127341      16904 United Kingdom
## 127345      16904 United Kingdom
## 127346      16904 United Kingdom
## 127350      16904 United Kingdom
## 127352      16904 United Kingdom
## 127353      16904 United Kingdom
## 127354      16904 United Kingdom
## 127356      16904 United Kingdom
## 127357      16904 United Kingdom
## 127358      16904 United Kingdom
## 127362      16904 United Kingdom
## 127363      16904 United Kingdom
## 127364      16904 United Kingdom
## 127365      16904 United Kingdom
## 127366      16904 United Kingdom
## 127367      16904 United Kingdom
## 127369      16904 United Kingdom
## 127385      16904 United Kingdom
## 127426      16745 United Kingdom
## 127705      16022 United Kingdom
## 127710      16022 United Kingdom
## 127725      16022 United Kingdom
## 127751      16022 United Kingdom
## 127755      16022 United Kingdom
## 127802      13069 United Kingdom
## 127926      16769 United Kingdom
## 127941      16769 United Kingdom
## 128103      17757 United Kingdom
## 128233      14056 United Kingdom
## 128234      14056 United Kingdom
## 128236      14056 United Kingdom
## 128237      14056 United Kingdom
## 128283      18109 United Kingdom
## 128289      16905 United Kingdom
## 128290      16905 United Kingdom
## 128291      16905 United Kingdom
## 128295      16905 United Kingdom
## 128296      16905 United Kingdom
## 128312      16905 United Kingdom
## 128315      16905 United Kingdom
## 128597      17979 United Kingdom
## 128620      17979 United Kingdom
## 128634      17979 United Kingdom
## 128712      14587 United Kingdom
## 128751      14587 United Kingdom
## 129036      14536 United Kingdom
## 129190      12748 United Kingdom
## 129191      12748 United Kingdom
## 129203      12748 United Kingdom
## 129204      12748 United Kingdom
## 129807      17625 United Kingdom
## 129880      17625 United Kingdom
## 130010      13357 United Kingdom
## 130071      13668 United Kingdom
## 130072      13668 United Kingdom
## 130157      16777 United Kingdom
## 130163      16777 United Kingdom
## 130204      14476 United Kingdom
## 130213      14476 United Kingdom
## 130779      14410 United Kingdom
## 130784      14410 United Kingdom
## 130821      14410 United Kingdom
## 130835      14410 United Kingdom
## 130952      14159 United Kingdom
## 130992      14159 United Kingdom
## 131371      16814 United Kingdom
## 131895      17238 United Kingdom
## 131896      17238 United Kingdom
## 134315      17220 United Kingdom
## 134316      17220 United Kingdom
## 134363      16657 United Kingdom
## 134366      16657 United Kingdom
## 134374      16657 United Kingdom
## 134378      16657 United Kingdom
## 134380      16657 United Kingdom
## 134385      16657 United Kingdom
## 134386      16657 United Kingdom
## 134389      16657 United Kingdom
## 134394      16657 United Kingdom
## 134401      16657 United Kingdom
## 134475      16059 United Kingdom
## 134501      15353 United Kingdom
## 134534      15353 United Kingdom
## 134696      16788 United Kingdom
## 134698      16788 United Kingdom
## 134700      16788 United Kingdom
## 134701      16788 United Kingdom
## 134703      16788 United Kingdom
## 134708      16788 United Kingdom
## 135325      13268 United Kingdom
## 135356      13268 United Kingdom
## 135403      17400 United Kingdom
## 135410      17400 United Kingdom
## 135721      17365 United Kingdom
## 135971      17841 United Kingdom
## 137019      14525 United Kingdom
## 137021      14525 United Kingdom
## 137301      14543 United Kingdom
## 137316         NA United Kingdom
## 137485      13137 United Kingdom
## 137527      14419 United Kingdom
## 138040      13124 United Kingdom
## 138049      13124 United Kingdom
## 138079      13124 United Kingdom
## 138082      13124 United Kingdom
## 138098      13124 United Kingdom
## 138102      13124 United Kingdom
## 138106      13124 United Kingdom
## 138154      15356 United Kingdom
## 138156      15356 United Kingdom
## 138168      15356 United Kingdom
## 138169      15356 United Kingdom
## 138174      15356 United Kingdom
## 138373      16010 United Kingdom
## 138375      16010 United Kingdom
## 138382      16010 United Kingdom
## 138384      16010 United Kingdom
## 138386      16010 United Kingdom
## 138388      16010 United Kingdom
## 138401      16010 United Kingdom
## 138471      13269 United Kingdom
## 138599      18116 United Kingdom
## 138603      18116 United Kingdom
## 138617      18116 United Kingdom
## 138670      17050 United Kingdom
## 138672      17050 United Kingdom
## 138683      17050 United Kingdom
## 138691      17050 United Kingdom
## 138731      17337 United Kingdom
## 138768      17337 United Kingdom
## 138784      17337 United Kingdom
## 138835      17337 United Kingdom
## 138840      17337 United Kingdom
## 139232      15493 United Kingdom
## 139450      17886 United Kingdom
## 139499      14711 United Kingdom
## 139506      14711 United Kingdom
## 139513      14711 United Kingdom
## 139528      14711 United Kingdom
## 139732      13263 United Kingdom
## 140558      17214 United Kingdom
## 140628      17940 United Kingdom
## 140795      15572 United Kingdom
## 141035      16906 United Kingdom
## 141161      14535 United Kingdom
## 141937      16241 United Kingdom
## 142243      17140 United Kingdom
## 142246      17140 United Kingdom
## 142395      17042 United Kingdom
## 142460      14701 United Kingdom
## 142993      16515 United Kingdom
## 143037      15530 United Kingdom
## 143412      14449 United Kingdom
## 143418      14449 United Kingdom
## 143468      14465 United Kingdom
## 143500      14465 United Kingdom
## 143619      14465 United Kingdom
## 143638      14465 United Kingdom
## 143653      14465 United Kingdom
## 143659      14465 United Kingdom
## 143664      14465 United Kingdom
## 143729      15916 United Kingdom
## 143822      16469 United Kingdom
## 143838      16469 United Kingdom
## 143843      16469 United Kingdom
## 143966      16261 United Kingdom
## 143970      16261 United Kingdom
## 143971      16261 United Kingdom
## 143983      16261 United Kingdom
## 144061      13230 United Kingdom
## 144078      13230 United Kingdom
## 144832      18036 United Kingdom
## 144869      14958 United Kingdom
## 145085      18041 United Kingdom
## 145689         NA United Kingdom
## 145691         NA United Kingdom
## 145694         NA United Kingdom
## 145785      18118 United Kingdom
## 146029      13606 United Kingdom
## 146050      13606 United Kingdom
## 146051      13606 United Kingdom
## 146138      15058 United Kingdom
## 146139      15058 United Kingdom
## 146140      15058 United Kingdom
## 146141      15058 United Kingdom
## 146292      13610 United Kingdom
## 146295      13610 United Kingdom
## 146343      13632 United Kingdom
## 146386      15665 United Kingdom
## 146634      13956 United Kingdom
## 147289      17841 United Kingdom
## 147312      17841 United Kingdom
## 147447         NA United Kingdom
## 147562      17799 United Kingdom
## 147692      17827 United Kingdom
## 148098      14669 United Kingdom
## 148107      14669 United Kingdom
## 148124      14669 United Kingdom
## 148236      17972 United Kingdom
## 148734      17180 United Kingdom
## 148735      17180 United Kingdom
## 148794      17576 United Kingdom
## 148797      17576 United Kingdom
## 149157      13544 United Kingdom
## 149176      13544 United Kingdom
## 149178      13544 United Kingdom
## 149185      13544 United Kingdom
## 149186      13544 United Kingdom
## 149187      13544 United Kingdom
## 149191      13544 United Kingdom
## 149669      16348 United Kingdom
## 149700      16348 United Kingdom
## 149711      16348 United Kingdom
## 149756      16348 United Kingdom
## 149768      16348 United Kingdom
## 150102      17841 United Kingdom
## 150689      14390 United Kingdom
## 150865      12841 United Kingdom
## 150866      12841 United Kingdom
## 151451      16806 United Kingdom
## 151452      16806 United Kingdom
## 151454      16806 United Kingdom
## 151606      14796 United Kingdom
## 152637      13048 United Kingdom
## 152742      17367 United Kingdom
## 152940      17243 United Kingdom
## 152942      17243 United Kingdom
## 152943      17243 United Kingdom
## 153072      13089 United Kingdom
## 153259      12748 United Kingdom
## 153260      12748 United Kingdom
## 153264      12748 United Kingdom
## 153281      12748 United Kingdom
## 153283      12748 United Kingdom
## 153284      12748 United Kingdom
## 153341      16770 United Kingdom
## 153350      16770 United Kingdom
## 153361      14524 United Kingdom
## 153365      14524 United Kingdom
## 153368      14524 United Kingdom
## 153373      14524 United Kingdom
## 153566      15555 United Kingdom
## 153568      15555 United Kingdom
## 153570      15555 United Kingdom
## 153574      15555 United Kingdom
## 153578      15555 United Kingdom
## 153579      15555 United Kingdom
## 153580      15555 United Kingdom
## 153581      15555 United Kingdom
## 153582      15555 United Kingdom
## 153591      15555 United Kingdom
## 153658      15555 United Kingdom
## 153665      13474 United Kingdom
## 153666      13474 United Kingdom
## 153702      13474 United Kingdom
## 153708      13474 United Kingdom
## 154013      16719 United Kingdom
## 154198      17284 United Kingdom
## 154402      16033 United Kingdom
## 154798      18116 United Kingdom
## 154800      18116 United Kingdom
## 154933      18009 United Kingdom
## 155849      17338 United Kingdom
## 155907      17338 United Kingdom
## 155913      17338 United Kingdom
## 156116      15311 United Kingdom
## 156826      18069 United Kingdom
## 156843      18069 United Kingdom
## 156870      18069 United Kingdom
## 156884      18069 United Kingdom
## 156926      16928 United Kingdom
## 156955      14502 United Kingdom
## 156994      14502 United Kingdom
## 157873      13263 United Kingdom
## 157910      13263 United Kingdom
## 157913      13263 United Kingdom
## 158164      16907 United Kingdom
## 158165      16907 United Kingdom
## 158166      16907 United Kingdom
## 158175      16907 United Kingdom
## 158177      16907 United Kingdom
## 158182      16907 United Kingdom
## 158183      16907 United Kingdom
## 158184      16907 United Kingdom
## 158672      18116 United Kingdom
## 158745      15436 United Kingdom
## 158746      15436 United Kingdom
## 158808      15436 United Kingdom
## 158809      15436 United Kingdom
## 158811      15436 United Kingdom
## 159677      18177 United Kingdom
## 159781      17530 United Kingdom
## 160124      15034 United Kingdom
## 161116      18283 United Kingdom
## 161658      13969 United Kingdom
## 161755      14562 United Kingdom
## 162645      16942 United Kingdom
## 162648      16942 United Kingdom
## 162650      16942 United Kingdom
## 162709      13668 United Kingdom
## 162766      14640 United Kingdom
## 162912      15581 United Kingdom
## 163097      13230 United Kingdom
## 163334      13263 United Kingdom
## 163426         NA United Kingdom
## 164035      15891 United Kingdom
## 164036      15891 United Kingdom
## 164169      16016 United Kingdom
## 164175      16016 United Kingdom
## 164191      13637 United Kingdom
## 164208      13637 United Kingdom
## 165549      17893 United Kingdom
## 165686      16904 United Kingdom
## 165781      15311 United Kingdom
## 165975      16370 United Kingdom
## 165981      16370 United Kingdom
## 166122      14800 United Kingdom
## 166415      15376 United Kingdom
## 166773      17841 United Kingdom
## 166792      17841 United Kingdom
## 166800      17841 United Kingdom
## 166801      17841 United Kingdom
## 166807      17841 United Kingdom
## 167017      15048 United Kingdom
## 167028      15048 United Kingdom
## 167245      13668 United Kingdom
## 167390      16806 United Kingdom
## 168010      18118 United Kingdom
## 168044      14298 United Kingdom
## 168177      13268 United Kingdom
## 168179      13268 United Kingdom
## 168419      17974 United Kingdom
## 168421      17974 United Kingdom
## 168951      16767 United Kingdom
## 169431      15356 United Kingdom
## 169453      15356 United Kingdom
## 169576      15023 United Kingdom
## 169696      13888 United Kingdom
## 172705      12748 United Kingdom
## 172778      12748 United Kingdom
## 172866      15796 United Kingdom
## 172957      14161 United Kingdom
## 172964      14161 United Kingdom
## 172980      14161 United Kingdom
## 172982      14161 United Kingdom
## 173014      15038 United Kingdom
## 173026      15038 United Kingdom
## 173068      16121 United Kingdom
## 173084      16121 United Kingdom
## 173095      16121 United Kingdom
## 173216      13642 United Kingdom
## 173221      13642 United Kingdom
## 173233      13642 United Kingdom
## 173235      13642 United Kingdom
## 173236      13642 United Kingdom
## 173246      13642 United Kingdom
## 173247      13642 United Kingdom
## 173248      13642 United Kingdom
## 173250      13642 United Kingdom
## 173374      14040 United Kingdom
## 173384      14040 United Kingdom
## 173419      14684 United Kingdom
## 173432      14684 United Kingdom
## 173444      14684 United Kingdom
## 173452      14684 United Kingdom
## 173454      14684 United Kingdom
## 173460      14684 United Kingdom
## 173461      14684 United Kingdom
## 173485      14684 United Kingdom
## 173487      14684 United Kingdom
## 173492      14684 United Kingdom
## 173493      14684 United Kingdom
## 173504      14684 United Kingdom
## 173505      14684 United Kingdom
## 173509      14684 United Kingdom
## 173511      14684 United Kingdom
## 173513      14684 United Kingdom
## 173514      14684 United Kingdom
## 173515      14684 United Kingdom
## 173524      14684 United Kingdom
## 173531      14684 United Kingdom
## 173534      14684 United Kingdom
## 173536      14684 United Kingdom
## 173545      14684 United Kingdom
## 173550      14684 United Kingdom
## 173567      16393 United Kingdom
## 173568      16393 United Kingdom
## 173640      16007 United Kingdom
## 173764      14224 United Kingdom
## 173812      15518 United Kingdom
## 173953      12748 United Kingdom
## 174017      17323 United Kingdom
## 174023      17323 United Kingdom
## 174193      17231 United Kingdom
## 174727      16326 United Kingdom
## 174793      14667 United Kingdom
## 176840      16431 United Kingdom
## 176842      16431 United Kingdom
## 176877      14591 United Kingdom
## 176879      14591 United Kingdom
## 176887      14591 United Kingdom
## 176892      14591 United Kingdom
## 176901      14591 United Kingdom
## 176903      14591 United Kingdom
## 176904      14591 United Kingdom
## 176906      14591 United Kingdom
## 176950      15756 United Kingdom
## 178448      14462 United Kingdom
## 178944      14573 United Kingdom
## 179195      18118 United Kingdom
## 179438      14277         France
## 179489      13662 United Kingdom
## 179639      14367 United Kingdom
## 179685      14649 United Kingdom
## 179806      16712 United Kingdom
## 180695      16033 United Kingdom
## 181301      17764 United Kingdom
## 181302      17764 United Kingdom
## 181339      14651 United Kingdom
## 181633         NA United Kingdom
## 181771      13451 United Kingdom
## 181780      13451 United Kingdom
## 181795      13451 United Kingdom
## 181801      12748 United Kingdom
## 181912      17970 United Kingdom
## 181917      17970 United Kingdom
## 182018      17337 United Kingdom
## 182042      17337 United Kingdom
## 182279      17886 United Kingdom
## 182308      16161 United Kingdom
## 182383      17238 United Kingdom
## 182677      17765 United Kingdom
## 182792      15907 United Kingdom
## 182804      15907 United Kingdom
## 182808      15907 United Kingdom
## 182809      15907 United Kingdom
## 182813      15907 United Kingdom
## 182814      15907 United Kingdom
## 182821      15907 United Kingdom
## 183296         NA United Kingdom
## 183706      17107 United Kingdom
## 183778      13232 United Kingdom
## 183895      15033 United Kingdom
## 184171      17758 United Kingdom
## 185952      17811 United Kingdom
## 186230      13208 United Kingdom
## 186262      13246 United Kingdom
## 186309      18043 United Kingdom
## 186310      18043 United Kingdom
## 186558      17238 United Kingdom
## 186573         NA United Kingdom
## 187486      16156 United Kingdom
## 187499      16156 United Kingdom
## 187707      14282 United Kingdom
## 187708      14282 United Kingdom
## 187855      14583 United Kingdom
## 187858      14583 United Kingdom
## 187861      14583 United Kingdom
## 187862      14583 United Kingdom
## 187863      14583 United Kingdom
## 187864      14583 United Kingdom
## 187867      14583 United Kingdom
## 187872      14583 United Kingdom
## 187874      14583 United Kingdom
## 187880      14583 United Kingdom
## 187886      14583 United Kingdom
## 187887      14583 United Kingdom
## 187891      14583 United Kingdom
## 187895      14583 United Kingdom
## 188138      16814 United Kingdom
## 188232      13258 United Kingdom
## 188241      13258 United Kingdom
## 188887      12481        Germany
## 189749      16813 United Kingdom
## 189752      16813 United Kingdom
## 189753      16813 United Kingdom
## 189757      16813 United Kingdom
## 189760      16813 United Kingdom
## 189771      16813 United Kingdom
## 189779      16813 United Kingdom
## 189781      16813 United Kingdom
## 189784      16813 United Kingdom
## 189791      16813 United Kingdom
## 189792      16813 United Kingdom
## 190855      15856 United Kingdom
## 190868      15856 United Kingdom
## 190869      15856 United Kingdom
## 190871      15856 United Kingdom
## 190874      15856 United Kingdom
## 190879      15856 United Kingdom
## 190882      15856 United Kingdom
## 190886      15856 United Kingdom
## 190887      15856 United Kingdom
## 190888      15856 United Kingdom
## 191259      13243 United Kingdom
## 191813      12916 United Kingdom
## 192234      16801 United Kingdom
## 192499      14769 United Kingdom
## 192509      14769 United Kingdom
## 192586      14769 United Kingdom
## 192588      14769 United Kingdom
## 192661      14769 United Kingdom
## 192663      14769 United Kingdom
## 192678      14769 United Kingdom
## 192679      14769 United Kingdom
## 192799      14647 United Kingdom
## 192803      14647 United Kingdom
## 192953      14711 United Kingdom
## 193034      13668 United Kingdom
## 193084      17611 United Kingdom
## 193143      17611 United Kingdom
## 193173      15292 United Kingdom
## 193637      14049 United Kingdom
## 193725      14049 United Kingdom
## 193748      18283 United Kingdom
## 193749      18283 United Kingdom
## 193750      18283 United Kingdom
## 193761      18283 United Kingdom
## 193762      18283 United Kingdom
## 193763      18283 United Kingdom
## 193765      18283 United Kingdom
## 193839      17841 United Kingdom
## 193981      13546 United Kingdom
## 194252      13831 United Kingdom
## 194264      13831 United Kingdom
## 194735      16729 United Kingdom
## 195296      17365 United Kingdom
## 197106      15311 United Kingdom
## 197564      16448 United Kingdom
## 197800      16161 United Kingdom
## 199027      15104 United Kingdom
## 199028      15104 United Kingdom
## 199042      17345 United Kingdom
## 199146      13232 United Kingdom
## 199336      17841 United Kingdom
## 199827      15867 United Kingdom
## 200028      17613 United Kingdom
## 200029      17613 United Kingdom
## 200030      17613 United Kingdom
## 200071      17613 United Kingdom
## 200072      17613 United Kingdom
## 200073      17613 United Kingdom
## 200202      15897 United Kingdom
## 200207      15897 United Kingdom
## 200272      16686 United Kingdom
## 200281      16686 United Kingdom
## 200282      16686 United Kingdom
## 200308      16686 United Kingdom
## 200316      16686 United Kingdom
## 200317      16686 United Kingdom
## 200323      16686 United Kingdom
## 200369      17051 United Kingdom
## 200412      14606 United Kingdom
## 200633      16814 United Kingdom
## 200635      16814 United Kingdom
## 200818      12748 United Kingdom
## 201052      18231 United Kingdom
## 201111      17841 United Kingdom
## 201123      17841 United Kingdom
## 201153      17841 United Kingdom
## 201154      17841 United Kingdom
## 201161      17841 United Kingdom
## 201167      17841 United Kingdom
## 201348      18204 United Kingdom
## 201356      18204 United Kingdom
## 201358      18204 United Kingdom
## 201365      18204 United Kingdom
## 201378      18204 United Kingdom
## 201946      12473        Germany
## 202096      16813 United Kingdom
## 204198      12517        Germany
## 204202      12517        Germany
## 204756      17231 United Kingdom
## 204828      17994 United Kingdom
## 205046      14700 United Kingdom
## 205637      17690 United Kingdom
## 205651      17690 United Kingdom
## 205652      17690 United Kingdom
## 205818      16923 United Kingdom
## 205819      16923 United Kingdom
## 205820      16923 United Kingdom
## 205821      16923 United Kingdom
## 205822      16923 United Kingdom
## 205823      16923 United Kingdom
## 205824      16923 United Kingdom
## 205826      16923 United Kingdom
## 205827      16923 United Kingdom
## 205828      16923 United Kingdom
## 205829      16923 United Kingdom
## 205830      16923 United Kingdom
## 205831      16923 United Kingdom
## 205832      16923 United Kingdom
## 205833      16923 United Kingdom
## 205835      16923 United Kingdom
## 205836      16923 United Kingdom
## 205837      16923 United Kingdom
## 205838      16923 United Kingdom
## 205839      16923 United Kingdom
## 205840      16923 United Kingdom
## 205841      16923 United Kingdom
## 205842      16923 United Kingdom
## 205843      16923 United Kingdom
## 205844      16923 United Kingdom
## 205845      16923 United Kingdom
## 205846      16923 United Kingdom
## 205847      16923 United Kingdom
## 205848      16923 United Kingdom
## 205849      16923 United Kingdom
## 205850      16923 United Kingdom
## 205852      16923 United Kingdom
## 205868      16923 United Kingdom
## 205880      16923 United Kingdom
## 205938      15722 United Kingdom
## 205942      15722 United Kingdom
## 205997      15453 United Kingdom
## 206016      15453 United Kingdom
## 206083      16883 United Kingdom
## 206303      13610 United Kingdom
## 206442      14159 United Kingdom
## 206443      14159 United Kingdom
## 206444      14159 United Kingdom
## 206534      17346 United Kingdom
## 206538      17346 United Kingdom
## 206564      17346 United Kingdom
## 206567      17346 United Kingdom
## 206568      17346 United Kingdom
## 206577      17346 United Kingdom
## 206646      17841 United Kingdom
## 206674      15005 United Kingdom
## 207022      15349 United Kingdom
## 208127      15737 United Kingdom
## 208215      17252 United Kingdom
## 208495      14606 United Kingdom
## 208700      14525 United Kingdom
## 208737      14525 United Kingdom
## 208750      14525 United Kingdom
## 208753      14525 United Kingdom
## 208823      14583 United Kingdom
## 208966      17015 United Kingdom
## 208970      17015 United Kingdom
## 208974      17015 United Kingdom
## 209036      14880 United Kingdom
## 209262      14375 United Kingdom
## 209276      14375 United Kingdom
## 209278      14375 United Kingdom
## 209279      14375 United Kingdom
## 209282      14375 United Kingdom
## 209285      14375 United Kingdom
## 209286      14375 United Kingdom
## 209292      14375 United Kingdom
## 209298      14375 United Kingdom
## 209316      12748 United Kingdom
## 209333      12748 United Kingdom
## 209334      12748 United Kingdom
## 209338      12748 United Kingdom
## 209368      15311 United Kingdom
## 209407      17124 United Kingdom
## 210467      15039 United Kingdom
## 210792      14367 United Kingdom
## 211008      17841 United Kingdom
## 211009      17841 United Kingdom
## 211026      17841 United Kingdom
## 211155      12748 United Kingdom
## 211162      12748 United Kingdom
## 211164      12748 United Kingdom
## 211798         NA United Kingdom
## 211799         NA United Kingdom
## 211977      16011 United Kingdom
## 212102      17360 United Kingdom
## 212107      17360 United Kingdom
## 212134      17360 United Kingdom
## 212406      13265 United Kingdom
## 213685      17841 United Kingdom
## 213796      16779 United Kingdom
## 213797      16779 United Kingdom
## 213976      13969 United Kingdom
## 214079      14584 United Kingdom
## 214080      14584 United Kingdom
## 215224      14984 United Kingdom
## 215328      17265 United Kingdom
## 215344      17265 United Kingdom
## 215389      17265 United Kingdom
## 215599      16115 United Kingdom
## 215718      16938 United Kingdom
## 215719      16938 United Kingdom
## 215745      16938 United Kingdom
## 215798      16938 United Kingdom
## 215808      16938 United Kingdom
## 215835      16938 United Kingdom
## 215915      17289 United Kingdom
## 215929      17289 United Kingdom
## 215975      14704 United Kingdom
## 215979      14704 United Kingdom
## 215985      14704 United Kingdom
## 215988      14704 United Kingdom
## 216021      16794 United Kingdom
## 216030      16794 United Kingdom
## 216031      16794 United Kingdom
## 216594      14177 United Kingdom
## 217169      17349 United Kingdom
## 217965      16919 United Kingdom
## 218104      14730 United Kingdom
## 219143         NA United Kingdom
## 219632      16461 United Kingdom
## 219646      14395 United Kingdom
## 219840      16904 United Kingdom
## 219885      16904 United Kingdom
## 219887      16904 United Kingdom
## 219889      16904 United Kingdom
## 219890      16904 United Kingdom
## 219894      16904 United Kingdom
## 219897      16904 United Kingdom
## 219943      12748 United Kingdom
## 219987      12748 United Kingdom
## 220009      12748 United Kingdom
## 220017      12748 United Kingdom
## 220019      12748 United Kingdom
## 220022      12748 United Kingdom
## 220030      12748 United Kingdom
## 220031      12748 United Kingdom
## 220069      15005 United Kingdom
## 220140      15036 United Kingdom
## 220145      15036 United Kingdom
## 220150      15036 United Kingdom
## 220155      15036 United Kingdom
## 220160      15036 United Kingdom
## 220172      15036 United Kingdom
## 220234      16898 United Kingdom
## 220448      16324 United Kingdom
## 220452      16324 United Kingdom
## 220453      16324 United Kingdom
## 220454      16324 United Kingdom
## 221232      15907 United Kingdom
## 221235      15907 United Kingdom
## 221238      15907 United Kingdom
## 221239      15907 United Kingdom
## 221242      15907 United Kingdom
## 221243      15907 United Kingdom
## 221244      15907 United Kingdom
## 221533      17368 United Kingdom
## 221534      17368 United Kingdom
## 222273      17841 United Kingdom
## 222606      15021 United Kingdom
## 222617      15021 United Kingdom
## 222625      15021 United Kingdom
## 223080      12748 United Kingdom
## 223394      17769 United Kingdom
## 223411      17769 United Kingdom
## 223434      17769 United Kingdom
## 223604      18077 United Kingdom
## 223669      16813 United Kingdom
## 223670      16813 United Kingdom
## 223689      16813 United Kingdom
## 224002      13568 United Kingdom
## 224694      15921 United Kingdom
## 224736      17897 United Kingdom
## 224742      17897 United Kingdom
## 224948      14808 United Kingdom
## 224953      14808 United Kingdom
## 226428      15507 United Kingdom
## 227052      17841 United Kingdom
## 227071      17841 United Kingdom
## 227372         NA United Kingdom
## 228044      17585 United Kingdom
## 228051      17585 United Kingdom
## 228052      17585 United Kingdom
## 228426      15041 United Kingdom
## 228546      14998 United Kingdom
## 228682      14854 United Kingdom
## 228795      17365 United Kingdom
## 228914      13268 United Kingdom
## 228996      14159 United Kingdom
## 229361      17799 United Kingdom
## 229376      17799 United Kingdom
## 229513      14534 United Kingdom
## 229530      14534 United Kingdom
## 230259      18283 United Kingdom
## 230261      18283 United Kingdom
## 230262      18283 United Kingdom
## 230263      18283 United Kingdom
## 230284      18283 United Kingdom
## 230291      18283 United Kingdom
## 230293      18283 United Kingdom
## 230295      18283 United Kingdom
## 230297      18283 United Kingdom
## 230312      18283 United Kingdom
## 230327      18283 United Kingdom
## 230427      15453 United Kingdom
## 230877      15850 United Kingdom
## 230888      15850 United Kingdom
## 230893      15850 United Kingdom
## 231021      16395 United Kingdom
## 231504      16728 United Kingdom
## 231669      15532 United Kingdom
## 231680      15532 United Kingdom
## 231795      17593 United Kingdom
## 231829      17768 United Kingdom
## 231873      17372 United Kingdom
## 231946      15644 United Kingdom
## 231953      15644 United Kingdom
## 231955      15644 United Kingdom
## 231957      15644 United Kingdom
## 232026      15644 United Kingdom
## 232035      15644 United Kingdom
## 232720      15976 United Kingdom
## 232721      15976 United Kingdom
## 232802      17841 United Kingdom
## 232810      17841 United Kingdom
## 232818      17841 United Kingdom
## 232825      17841 United Kingdom
## 232838      17841 United Kingdom
## 232867      17841 United Kingdom
## 233128         NA United Kingdom
## 233167      14167 United Kingdom
## 233173      14167 United Kingdom
## 233590      12748 United Kingdom
## 233600      12748 United Kingdom
## 233601      12748 United Kingdom
## 233716         NA United Kingdom
## 233719         NA United Kingdom
## 233798      13614 United Kingdom
## 233822      13614 United Kingdom
## 233833      13614 United Kingdom
## 233836      13614 United Kingdom
## 233995      17750 United Kingdom
## 234007      17750 United Kingdom
## 234009      17750 United Kingdom
## 234011      17750 United Kingdom
## 234585      15334 United Kingdom
## 235585      15039 United Kingdom
## 235675      16904 United Kingdom
## 235716      16904 United Kingdom
## 235753      15005 United Kingdom
## 236006      17841 United Kingdom
## 236729      15584 United Kingdom
## 237461      17920 United Kingdom
## 237475      17920 United Kingdom
## 237480      17920 United Kingdom
## 237485      17920 United Kingdom
## 237500      17920 United Kingdom
## 237514      12748 United Kingdom
## 237528      12748 United Kingdom
## 237624      12748 United Kingdom
## 237633      12748 United Kingdom
## 237717      17338 United Kingdom
## 237727      17338 United Kingdom
## 237737      17338 United Kingdom
## 237741      17338 United Kingdom
## 237742      17338 United Kingdom
## 237748      15483 United Kingdom
## 237749      15483 United Kingdom
## 238022      16009 United Kingdom
## 238023      16009 United Kingdom
## 238027      16009 United Kingdom
## 238028      16009 United Kingdom
## 238039      16009 United Kingdom
## 238051      16009 United Kingdom
## 238054      16009 United Kingdom
## 238056      16009 United Kingdom
## 238116      15518 United Kingdom
## 238117      15518 United Kingdom
## 238180      13148 United Kingdom
## 238184      13148 United Kingdom
## 238276      15033 United Kingdom
## 238277      15033 United Kingdom
## 238278      15033 United Kingdom
## 238394      13833 United Kingdom
## 238397      15952 United Kingdom
## 238399      15952 United Kingdom
## 238410      15952 United Kingdom
## 238411      15952 United Kingdom
## 238441      17899 United Kingdom
## 239509      17975 United Kingdom
## 239514      17975 United Kingdom
## 239686      17243 United Kingdom
## 239877      17841 United Kingdom
## 239878      17841 United Kingdom
## 239884      17841 United Kingdom
## 239904      17841 United Kingdom
## 240136      14056 United Kingdom
## 240160      14056 United Kingdom
## 240594      15555 United Kingdom
## 240917      14606 United Kingdom
## 240918      14606 United Kingdom
## 240928      14606 United Kingdom
## 243030      17841 United Kingdom
## 243031      17841 United Kingdom
## 243037      17841 United Kingdom
## 243048      17841 United Kingdom
## 243054      17841 United Kingdom
## 243162      15889 United Kingdom
## 243221      15021 United Kingdom
## 243233      15021 United Kingdom
## 243247      15021 United Kingdom
## 243380      17341 United Kingdom
## 243549      17861 United Kingdom
## 245018      16743 United Kingdom
## 245158      15356 United Kingdom
## 246868      18121 United Kingdom
## 248011         NA United Kingdom
## 248129      16923 United Kingdom
## 248137      16923 United Kingdom
## 248139      16923 United Kingdom
## 248405      16880 United Kingdom
## 248418      16880 United Kingdom
## 248512      17126 United Kingdom
## 248571      17126 United Kingdom
## 248711      17997 United Kingdom
## 248755      13230 United Kingdom
## 248794      13230 United Kingdom
## 248867      16014 United Kingdom
## 248883      16014 United Kingdom
## 248914      16014 United Kingdom
## 249055      14690 United Kingdom
## 249129      13184 United Kingdom
## 249184      14552 United Kingdom
## 249333      12556          Spain
## 249339      12556          Spain
## 249444      14796 United Kingdom
## 249559      15856 United Kingdom
## 250237         NA United Kingdom
## 250962      17841 United Kingdom
## 251004      17841 United Kingdom
## 251011      17841 United Kingdom
## 251047      16409 United Kingdom
## 251558         NA United Kingdom
## 251628         NA United Kingdom
## 252232      15752 United Kingdom
## 252243      15752 United Kingdom
## 252267      15752 United Kingdom
## 252443      13263 United Kingdom
## 252451      13263 United Kingdom
## 252560      14159 United Kingdom
## 252612      14159 United Kingdom
## 252613      14159 United Kingdom
## 252622      14159 United Kingdom
## 252623      14159 United Kingdom
## 252661      14159 United Kingdom
## 252789      14502 United Kingdom
## 252792      14502 United Kingdom
## 253138      13667 United Kingdom
## 253145      13667 United Kingdom
## 253154      13667 United Kingdom
## 253199      13667 United Kingdom
## 253912      16657 United Kingdom
## 253925      16657 United Kingdom
## 254037      14716 United Kingdom
## 254081      15987 United Kingdom
## 254088      15987 United Kingdom
## 254098      15987 United Kingdom
## 254100      15987 United Kingdom
## 254107      15987 United Kingdom
## 254113      15987 United Kingdom
## 254116      15987 United Kingdom
## 254123      15987 United Kingdom
## 254129      15987 United Kingdom
## 254213      18283 United Kingdom
## 254216      18283 United Kingdom
## 254238      16928 United Kingdom
## 254412      17259 United Kingdom
## 254417      17259 United Kingdom
## 254419      17259 United Kingdom
## 255008      17921 United Kingdom
## 255025      17921 United Kingdom
## 255480      15311 United Kingdom
## 255566      15004 United Kingdom
## 255581      15004 United Kingdom
## 255601      15004 United Kingdom
## 255637      15004 United Kingdom
## 255738      14722 United Kingdom
## 255774      16904 United Kingdom
## 255780      16904 United Kingdom
## 255791      16904 United Kingdom
## 255795      16904 United Kingdom
## 256245      17750 United Kingdom
## 256331      16813 United Kingdom
## 256335      16813 United Kingdom
## 256546      16931 United Kingdom
## 256597         NA    Switzerland
## 256609         NA    Switzerland
## 256622         NA    Switzerland
## 256770      17774 United Kingdom
## 256773      17774 United Kingdom
## 256791      17774 United Kingdom
## 257041      14044 United Kingdom
## 257206      16744 United Kingdom
## 257240      16474 United Kingdom
## 257250      16474 United Kingdom
## 257264      16474 United Kingdom
## 257272      16474 United Kingdom
## 257278      16474 United Kingdom
## 257286      16474 United Kingdom
## 257291      16474 United Kingdom
## 257296      16474 United Kingdom
## 257300      16474 United Kingdom
## 257311      16474 United Kingdom
## 257320      16474 United Kingdom
## 257931      16511 United Kingdom
## 257938      16511 United Kingdom
## 258431      14583 United Kingdom
## 258435      14583 United Kingdom
## 258531      14808 United Kingdom
## 259528      13764 United Kingdom
## 260329      14178 United Kingdom
## 260340      14178 United Kingdom
## 260351      14178 United Kingdom
## 260354      14178 United Kingdom
## 260357      14178 United Kingdom
## 260359      14178 United Kingdom
## 260364      14178 United Kingdom
## 261145      16271 United Kingdom
## 261174      16271 United Kingdom
## 261178      16271 United Kingdom
## 261257      15529 United Kingdom
## 261449      14704 United Kingdom
## 261452      14704 United Kingdom
## 261453      14704 United Kingdom
## 261589      16729 United Kingdom
## 261880      16464 United Kingdom
## 261887      16464 United Kingdom
## 262011      17962 United Kingdom
## 262150      14056 United Kingdom
## 263245      14688 United Kingdom
## 263340      18073 United Kingdom
## 263445      16891 United Kingdom
## 263461      16891 United Kingdom
## 263462      16891 United Kingdom
## 263468      16891 United Kingdom
## 263471      16891 United Kingdom
## 263625      15311 United Kingdom
## 263717      17660 United Kingdom
## 263720      17660 United Kingdom
## 263734      17660 United Kingdom
## 263741      17660 United Kingdom
## 263743      17660 United Kingdom
## 263744      17660 United Kingdom
## 263750      17660 United Kingdom
## 263804      12748 United Kingdom
## 263807      12748 United Kingdom
## 263813      12748 United Kingdom
## 265011      17920 United Kingdom
## 265016      17920 United Kingdom
## 265026      17920 United Kingdom
## 265027      17920 United Kingdom
## 265028      17920 United Kingdom
## 265029      17920 United Kingdom
## 265030      17920 United Kingdom
## 265031      17920 United Kingdom
## 265873      17265 United Kingdom
## 265882      17265 United Kingdom
## 266046      15506 United Kingdom
## 266088      13137 United Kingdom
## 266101      13137 United Kingdom
## 266105      13137 United Kingdom
## 266710      13956 United Kingdom
## 267141      14100 United Kingdom
## 267309      17841 United Kingdom
## 267314      17841 United Kingdom
## 267318      17841 United Kingdom
## 267763      16364 United Kingdom
## 268173         NA United Kingdom
## 269211      13668 United Kingdom
## 269757         NA United Kingdom
## 270313      16447 United Kingdom
## 270315      16447 United Kingdom
## 270449      17841 United Kingdom
## 270721      14534 United Kingdom
## 271205      17870 United Kingdom
## 271855      14898 United Kingdom
## 271880      14898 United Kingdom
## 271887      14898 United Kingdom
## 272428      12743    Unspecified
## 272508      12743    Unspecified
## 272541      12743    Unspecified
## 272911      14606 United Kingdom
## 273738      17750 United Kingdom
## 273757      17997 United Kingdom
## 273848      16813 United Kingdom
## 273849      16813 United Kingdom
## 273853      16813 United Kingdom
## 273882      16813 United Kingdom
## 273895      16813 United Kingdom
## 273983      13316 United Kingdom
## 274445      12942 United Kingdom
## 274455      12942 United Kingdom
## 274462      12942 United Kingdom
## 274463      12942 United Kingdom
## 274478      12942 United Kingdom
## 274715      17841 United Kingdom
## 274829      16655 United Kingdom
## 274830      16655 United Kingdom
## 275101      13184 United Kingdom
## 275143      14408 United Kingdom
## 275494      16332 United Kingdom
## 275887      16984 United Kingdom
## 275895      16984 United Kingdom
## 276008      16984 United Kingdom
## 276710      15311 United Kingdom
## 277044      14076 United Kingdom
## 277047      14076 United Kingdom
## 278157      16324 United Kingdom
## 278177      16324 United Kingdom
## 278183      16324 United Kingdom
## 278325      13975 United Kingdom
## 278326      13975 United Kingdom
## 278343      13975 United Kingdom
## 278379      13975 United Kingdom
## 278635      16348 United Kingdom
## 278640      16348 United Kingdom
## 278650      16348 United Kingdom
## 278665      16348 United Kingdom
## 278671      16348 United Kingdom
## 278674      16348 United Kingdom
## 278675      16348 United Kingdom
## 280425      17267 United Kingdom
## 280694      14562 United Kingdom
## 280771      18097 United Kingdom
## 280978      16928 United Kingdom
## 281028      15719 United Kingdom
## 281051      15719 United Kingdom
## 281086      15719 United Kingdom
## 281184      16880 United Kingdom
## 281385      17220 United Kingdom
## 281447      17400 United Kingdom
## 281454      17400 United Kingdom
## 281455      17400 United Kingdom
## 281465      17400 United Kingdom
## 281500      17400 United Kingdom
## 281553      17377 United Kingdom
## 281598      17092 United Kingdom
## 281653      17231 United Kingdom
## 281683      17231 United Kingdom
## 281894      13451 United Kingdom
## 281923      13451 United Kingdom
## 281941      13451 United Kingdom
## 281987      13451 United Kingdom
## 282126      13782 United Kingdom
## 282127      13782 United Kingdom
## 282202      14903 United Kingdom
## 282205      14903 United Kingdom
## 282336      13752 United Kingdom
## 282391      15640 United Kingdom
## 282502      16549 United Kingdom
## 282956      15311 United Kingdom
## 283063      17954 United Kingdom
## 283064      17954 United Kingdom
## 283264      13869 United Kingdom
## 283292      13869 United Kingdom
## 283450      16788 United Kingdom
## 284172      13097 United Kingdom
## 284301      17841 United Kingdom
## 285248      16241 United Kingdom
## 285680      15494 United Kingdom
## 286331         NA United Kingdom
## 286347         NA United Kingdom
## 287340      18077 United Kingdom
## 287341      18077 United Kingdom
## 287471      15747 United Kingdom
## 287477      15747 United Kingdom
## 287574      16928 United Kingdom
## 288214      14525 United Kingdom
## 289302      13838 United Kingdom
## 289318      13838 United Kingdom
## 289369      14040 United Kingdom
## 289451      13527 United Kingdom
## 289592      16370 United Kingdom
## 289608      16370 United Kingdom
## 289638      16370 United Kingdom
## 289871      15048 United Kingdom
## 290274      14606 United Kingdom
## 290384      14623 United Kingdom
## 290576      15271 United Kingdom
## 290584      15271 United Kingdom
## 290587      15271 United Kingdom
## 290597      15271 United Kingdom
## 290832      15752 United Kingdom
## 290844      15752 United Kingdom
## 291568      18241 United Kingdom
## 292129      15039 United Kingdom
## 292468      16755 United Kingdom
## 292525      16755 United Kingdom
## 292527      16755 United Kingdom
## 292529      16755 United Kingdom
## 292538      16755 United Kingdom
## 292654      15786 United Kingdom
## 293033      16734 United Kingdom
## 293239      17070 United Kingdom
## 293240      17070 United Kingdom
## 293267      17450 United Kingdom
## 293327      12688         Israel
## 293596      15301 United Kingdom
## 294607      17576 United Kingdom
## 294677      14064 United Kingdom
## 294716      16261 United Kingdom
## 294746      15024 United Kingdom
## 294768      17750 United Kingdom
## 295236      16419 United Kingdom
## 295664      18109 United Kingdom
## 295740      15701 United Kingdom
## 295783      15701 United Kingdom
## 295785      15701 United Kingdom
## 295885      14224 United Kingdom
## 295886      14224 United Kingdom
## 295893      14224 United Kingdom
## 295896      14224 United Kingdom
## 295927      14572 United Kingdom
## 295943      14572 United Kingdom
## 295952      14572 United Kingdom
## 295967      14572 United Kingdom
## 295999      16407 United Kingdom
## 296001      16407 United Kingdom
## 296005      16407 United Kingdom
## 296083      15984 United Kingdom
## 296108      15984 United Kingdom
## 296115      15984 United Kingdom
## 296118      15984 United Kingdom
## 296157      15984 United Kingdom
## 296169      15984 United Kingdom
## 296182      15984 United Kingdom
## 296189      15984 United Kingdom
## 296226      13610 United Kingdom
## 296486      16536 United Kingdom
## 296516      15547 United Kingdom
## 297200      17585 United Kingdom
## 297201      17585 United Kingdom
## 297202      17585 United Kingdom
## 297345      15033 United Kingdom
## 298114      16904 United Kingdom
## 298620      16033 United Kingdom
## 299087      13263 United Kingdom
## 299680      16723 United Kingdom
## 299780      16042 United Kingdom
## 300150      16029 United Kingdom
## 300251      15800 United Kingdom
## 300308      15800 United Kingdom
## 300379      16340 United Kingdom
## 300382      16340 United Kingdom
## 300384      16340 United Kingdom
## 300387      16340 United Kingdom
## 300388      16340 United Kingdom
## 300389      16340 United Kingdom
## 300426      16340 United Kingdom
## 300430      16340 United Kingdom
## 300431      16340 United Kingdom
## 300469      16340 United Kingdom
## 300492      16340 United Kingdom
## 300499      16340 United Kingdom
## 300769      13969 United Kingdom
## 300808      13969 United Kingdom
## 300810      13969 United Kingdom
## 300822      13969 United Kingdom
## 301816      15805 United Kingdom
## 301986      13159 United Kingdom
## 302033      12715         Sweden
## 302153      18200 United Kingdom
## 302167      18200 United Kingdom
## 302220      12748 United Kingdom
## 302786      17920 United Kingdom
## 302960      15074 United Kingdom
## 303128      14472 United Kingdom
## 303129      14472 United Kingdom
## 303130      14472 United Kingdom
## 303131      14472 United Kingdom
## 303137      14472 United Kingdom
## 303214      15325 United Kingdom
## 303353      18041 United Kingdom
## 303379      18041 United Kingdom
## 303418      18041 United Kingdom
## 303437      18077 United Kingdom
## 303457      16686 United Kingdom
## 303462      16686 United Kingdom
## 303480      16686 United Kingdom
## 303481      16686 United Kingdom
## 303492      16686 United Kingdom
## 303509      16686 United Kingdom
## 303511      16686 United Kingdom
## 303521      16686 United Kingdom
## 303522      16686 United Kingdom
## 303526      16686 United Kingdom
## 303542      16686 United Kingdom
## 303543      16686 United Kingdom
## 303544      16686 United Kingdom
## 303557      16686 United Kingdom
## 303640      13137 United Kingdom
## 303729      17841 United Kingdom
## 303818      12484          Spain
## 303893      12484          Spain
## 303984      16931 United Kingdom
## 303995      16931 United Kingdom
## 303996      16931 United Kingdom
## 304042      14044 United Kingdom
## 304095      17346 United Kingdom
## 304106      17346 United Kingdom
## 304160      16806 United Kingdom
## 304164      16806 United Kingdom
## 304172      16806 United Kingdom
## 304178      16806 United Kingdom
## 304182      16806 United Kingdom
## 304191      16806 United Kingdom
## 304226      14869 United Kingdom
## 307320      15866 United Kingdom
## 307339      15866 United Kingdom
## 307385      16928 United Kingdom
## 308095      17777 United Kingdom
## 308096      17777 United Kingdom
## 308543      16780 United Kingdom
## 308659      15856 United Kingdom
## 308660      15856 United Kingdom
## 309201      17841 United Kingdom
## 309204      17841 United Kingdom
## 309205      17841 United Kingdom
## 309231      17841 United Kingdom
## 309241      17841 United Kingdom
## 309498      16923 United Kingdom
## 309576      17799 United Kingdom
## 309669      16729 United Kingdom
## 311343         NA    Unspecified
## 311510      13232 United Kingdom
## 311511      13232 United Kingdom
## 311512      13232 United Kingdom
## 311634      14606 United Kingdom
## 311668      16674 United Kingdom
## 311669      16674 United Kingdom
## 312006      14415 United Kingdom
## 312296      15856 United Kingdom
## 312300      15856 United Kingdom
## 312329      16686 United Kingdom
## 312331      16686 United Kingdom
## 312338      16686 United Kingdom
## 312340      16686 United Kingdom
## 312385      13804 United Kingdom
## 312430      16983 United Kingdom
## 312454      16813 United Kingdom
## 312455      16813 United Kingdom
## 312461      16813 United Kingdom
## 312532      13772 United Kingdom
## 312711      16326 United Kingdom
## 312745      16744 United Kingdom
## 312746      16744 United Kingdom
## 312753      16744 United Kingdom
## 312828      12851 United Kingdom
## 312829      12851 United Kingdom
## 312830      12851 United Kingdom
## 312909      14335        Germany
## 312924      14335        Germany
## 312940      14965 United Kingdom
## 312949      14965 United Kingdom
## 313044      16241 United Kingdom
## 313045      16241 United Kingdom
## 313162      12867 United Kingdom
## 313433      13548 United Kingdom
## 313626         NA United Kingdom
## 313663      16629 United Kingdom
## 313678      16629 United Kingdom
## 313679      16629 United Kingdom
## 313685      16629 United Kingdom
## 314001      15005 United Kingdom
## 314232      14159 United Kingdom
## 314267      14159 United Kingdom
## 314284      14159 United Kingdom
## 314309      14159 United Kingdom
## 315042      18196 United Kingdom
## 315052      18196 United Kingdom
## 315111      16712 United Kingdom
## 315173      13211 United Kingdom
## 315400      14796 United Kingdom
## 315489      14360 United Kingdom
## 315675      17191 United Kingdom
## 315959      17841 United Kingdom
## 315981      17841 United Kingdom
## 316024      17841 United Kingdom
## 316027      17841 United Kingdom
## 316038      17841 United Kingdom
## 318756      17004 United Kingdom
## 318856      13137 United Kingdom
## 318857      13137 United Kingdom
## 318858      13137 United Kingdom
## 318859      13137 United Kingdom
## 318863      13137 United Kingdom
## 318889      13137 United Kingdom
## 318940      17243 United Kingdom
## 318943      17243 United Kingdom
## 319100      16031 United Kingdom
## 319125      16031 United Kingdom
## 319442      15453 United Kingdom
## 319990      17841 United Kingdom
## 319994      17841 United Kingdom
## 320056      17870 United Kingdom
## 320110      17965 United Kingdom
## 320128      17965 United Kingdom
## 320424      18118 United Kingdom
## 320540      17800 United Kingdom
## 320557      12748 United Kingdom
## 320682      14711 United Kingdom
## 320928      16362 United Kingdom
## 320941      16362 United Kingdom
## 321258         NA United Kingdom
## 321370      16899 United Kingdom
## 321581      17377 United Kingdom
## 321583      17377 United Kingdom
## 321584      17377 United Kingdom
## 321596      17377 United Kingdom
## 321597      17377 United Kingdom
## 321726      13527 United Kingdom
## 321729      13527 United Kingdom
## 321736      13527 United Kingdom
## 321767      12841 United Kingdom
## 321818      13124 United Kingdom
## 321824      13124 United Kingdom
## 321830      13124 United Kingdom
## 321831      13124 United Kingdom
## 321833      13124 United Kingdom
## 321835      13124 United Kingdom
## 322004      17299 United Kingdom
## 322005      17299 United Kingdom
## 322057      17864 United Kingdom
## 322073      17864 United Kingdom
## 322093      17864 United Kingdom
## 322097      17864 United Kingdom
## 322099      17864 United Kingdom
## 322102      17864 United Kingdom
## 322103      17864 United Kingdom
## 322106      17864 United Kingdom
## 322107      17864 United Kingdom
## 322108      17864 United Kingdom
## 322109      17864 United Kingdom
## 322115      16523 United Kingdom
## 322237      14487 United Kingdom
## 322241      14487 United Kingdom
## 322242      14487 United Kingdom
## 322243      14487 United Kingdom
## 322336      16549 United Kingdom
## 322453      14432 United Kingdom
## 322472      14432 United Kingdom
## 322473      14432 United Kingdom
## 322609      12748 United Kingdom
## 322619      12748 United Kingdom
## 322666      17838 United Kingdom
## 322705      13611 United Kingdom
## 322707      13611 United Kingdom
## 322870      14456 United Kingdom
## 322871      14456 United Kingdom
## 322906      14456 United Kingdom
## 322912      14456 United Kingdom
## 322930      14456 United Kingdom
## 322937      14456 United Kingdom
## 322955      14456 United Kingdom
## 322969      14456 United Kingdom
## 322972      14456 United Kingdom
## 322989      14456 United Kingdom
## 323077      12965 United Kingdom
## 323202      15547 United Kingdom
## 323283      17841 United Kingdom
## 323297      16794 United Kingdom
## 323312      16794 United Kingdom
## 323801      17685 United Kingdom
## 323805      17685 United Kingdom
## 323822      17685 United Kingdom
## 323919      17811 United Kingdom
## 324043      17139 United Kingdom
## 324132      16984 United Kingdom
## 324141      16984 United Kingdom
## 324172      16984 United Kingdom
## 324187      16984 United Kingdom
## 324258      16360 United Kingdom
## 324505      17090 United Kingdom
## 324506      17090 United Kingdom
## 324847      15673 United Kingdom
## 324848      15673 United Kingdom
## 324853      15673 United Kingdom
## 324857      15673 United Kingdom
## 324932      18069 United Kingdom
## 324955      18069 United Kingdom
## 325232      16814 United Kingdom
## 325343      15529 United Kingdom
## 325397      15529 United Kingdom
## 325455      17779 United Kingdom
## 325991      15522 United Kingdom
## 326852      16469 United Kingdom
## 326860      16469 United Kingdom
## 326874      16469 United Kingdom
## 327265      16279 United Kingdom
## 327634      18001 United Kingdom
## 328099      15021 United Kingdom
## 328133      15021 United Kingdom
## 328320      15707 United Kingdom
## 328331      15707 United Kingdom
## 328919      13518 United Kingdom
## 328931      13518 United Kingdom
## 329450      15573 United Kingdom
## 329453      15573 United Kingdom
## 329530      17786 United Kingdom
## 329916      17602 United Kingdom
## 330209      17576 United Kingdom
## 330215      17576 United Kingdom
## 332261      14056 United Kingdom
## 332466      17841 United Kingdom
## 332468      17841 United Kingdom
## 332586      14878 United Kingdom
## 332590      14878 United Kingdom
## 332612      13566 United Kingdom
## 332628      13566 United Kingdom
## 332639      13566 United Kingdom
## 332642      13566 United Kingdom
## 332697      13566 United Kingdom
## 332700      13566 United Kingdom
## 332701      13566 United Kingdom
## 332965      13334 United Kingdom
## 333019      14769 United Kingdom
## 333107      14769 United Kingdom
## 333120      14769 United Kingdom
## 333193      14769 United Kingdom
## 333198      14769 United Kingdom
## 333361      14769 United Kingdom
## 333373      14769 United Kingdom
## 333533      16370 United Kingdom
## 333541      16370 United Kingdom
## 333930      14159 United Kingdom
## 334099      16906 United Kingdom
## 334108      16906 United Kingdom
## 334110      16906 United Kingdom
## 334119      16906 United Kingdom
## 334128      16906 United Kingdom
## 334130      16906 United Kingdom
## 335247      16369 United Kingdom
## 335538      14446 United Kingdom
## 335563      14446 United Kingdom
## 335573      14446 United Kingdom
## 335582      14446 United Kingdom
## 335583      14446 United Kingdom
## 335584      14446 United Kingdom
## 335596      14446 United Kingdom
## 335642      15039 United Kingdom
## 335702      17841 United Kingdom
## 335767      13448 United Kingdom
## 335818      16360 United Kingdom
## 335833      16360 United Kingdom
## 335839      16360 United Kingdom
## 335850      16360 United Kingdom
## 335855      16360 United Kingdom
## 335857      16360 United Kingdom
## 335859      16360 United Kingdom
## 335865      16360 United Kingdom
## 335874      16360 United Kingdom
## 336028      16464 United Kingdom
## 336029      16464 United Kingdom
## 336036      16464 United Kingdom
## 337866      13959 United Kingdom
## 337867      13959 United Kingdom
## 337935      17758 United Kingdom
## 337936      17758 United Kingdom
## 337938      17758 United Kingdom
## 337939      17758 United Kingdom
## 339810      15950 United Kingdom
## 339845      17581 United Kingdom
## 340108      12854 United Kingdom
## 340156      17027 United Kingdom
## 340187      13804 United Kingdom
## 340311      14395 United Kingdom
## 340597      15484 United Kingdom
## 340839      16669 United Kingdom
## 341703      13012 United Kingdom
## 342028      13320 United Kingdom
## 342761      17841 United Kingdom
## 342809      17841 United Kingdom
## 342858      15901 United Kingdom
## 343600      14529 United Kingdom
## 343632      14529 United Kingdom
## 343636      14529 United Kingdom
## 343637      14529 United Kingdom
## 343642      14529 United Kingdom
## 344624      16326 United Kingdom
## 344626      16326 United Kingdom
## 344631      16326 United Kingdom
## 344635      16326 United Kingdom
## 344638      16326 United Kingdom
## 344647      16326 United Kingdom
## 344673      16744 United Kingdom
## 344962      14367 United Kingdom
## 345033      15860 United Kingdom
## 345036      15860 United Kingdom
## 345037      15860 United Kingdom
## 345089      14540 United Kingdom
## 345104      14540 United Kingdom
## 345105      14540 United Kingdom
## 345112      14540 United Kingdom
## 345121      14540 United Kingdom
## 345335      16931 United Kingdom
## 345337      16931 United Kingdom
## 345338      16931 United Kingdom
## 345339      16931 United Kingdom
## 345348      16931 United Kingdom
## 345360      16931 United Kingdom
## 345425      16261 United Kingdom
## 345426      16261 United Kingdom
## 345602      13991 United Kingdom
## 345607      13991 United Kingdom
## 345672      17837 United Kingdom
## 345681      17837 United Kingdom
## 345682      17837 United Kingdom
## 345683      17837 United Kingdom
## 345742      16049 United Kingdom
## 345780      16049 United Kingdom
## 345789      16049 United Kingdom
## 345934      16655 United Kingdom
## 345974      17107 United Kingdom
## 346349      15150 United Kingdom
## 346429      15154 United Kingdom
## 346453      15154 United Kingdom
## 346455      15154 United Kingdom
## 346472      15154 United Kingdom
## 346473      15154 United Kingdom
## 346474      15154 United Kingdom
## 346475      15154 United Kingdom
## 346476      15154 United Kingdom
## 346480      15154 United Kingdom
## 346487      15154 United Kingdom
## 346495      15154 United Kingdom
## 346504      15154 United Kingdom
## 346505      15154 United Kingdom
## 346507      15154 United Kingdom
## 346627      17377 United Kingdom
## 346662      16719 United Kingdom
## 346672      16719 United Kingdom
## 346698      17841 United Kingdom
## 346810      14808 United Kingdom
## 346938      13867 United Kingdom
## 346974      16383 United Kingdom
## 346979      16383 United Kingdom
## 346984      16383 United Kingdom
## 346986      16383 United Kingdom
## 347288      14667 United Kingdom
## 348802      13555 United Kingdom
## 348937      14456 United Kingdom
## 349173      16713 United Kingdom
## 349174      16713 United Kingdom
## 349175      16713 United Kingdom
## 350398      16460 United Kingdom
## 350441      16460 United Kingdom
## 350447      16460 United Kingdom
## 350542      16764 United Kingdom
## 350709      15750 United Kingdom
## 351064      16332 United Kingdom
## 351395      12748 United Kingdom
## 351480      15036 United Kingdom
## 351495      15036 United Kingdom
## 351519      14649 United Kingdom
## 351533      14649 United Kingdom
## 351535      14649 United Kingdom
## 351537      14649 United Kingdom
## 351538      14649 United Kingdom
## 351548      14649 United Kingdom
## 351619      17841 United Kingdom
## 351624      17841 United Kingdom
## 351641      17841 United Kingdom
## 351644      17841 United Kingdom
## 351649      17841 United Kingdom
## 351679      17841 United Kingdom
## 351686      17841 United Kingdom
## 351714      17841 United Kingdom
## 351715      17841 United Kingdom
## 353628      15050 United Kingdom
## 353632      15050 United Kingdom
## 353971      17220 United Kingdom
## 353976      17220 United Kingdom
## 354579      18204 United Kingdom
## 354602      18204 United Kingdom
## 354622      18204 United Kingdom
## 355715      16729 United Kingdom
## 355982      15034 United Kingdom
## 355999      15034 United Kingdom
## 356809      16923 United Kingdom
## 356855      17811 United Kingdom
## 356987      15164 United Kingdom
## 357129      15579 United Kingdom
## 357137      15579 United Kingdom
## 357170      15952 United Kingdom
## 357186      13558 United Kingdom
## 357201      13558 United Kingdom
## 357218      13558 United Kingdom
## 357219      13558 United Kingdom
## 357229      13558 United Kingdom
## 357272      16007 United Kingdom
## 357367      16007 United Kingdom
## 357578      15701 United Kingdom
## 357585      15701 United Kingdom
## 357587      15701 United Kingdom
## 357603      15701 United Kingdom
## 357626      16930 United Kingdom
## 357713      15547 United Kingdom
## 357766      14502 United Kingdom
## 357798      14502 United Kingdom
## 357841      14502 United Kingdom
## 357843      14502 United Kingdom
## 357887      16533 United Kingdom
## 358061      17841 United Kingdom
## 358074      17841 United Kingdom
## 358078      17841 United Kingdom
## 358284      13344 United Kingdom
## 358285      13344 United Kingdom
## 358309      13344 United Kingdom
## 358897      17321 United Kingdom
## 358906      17321 United Kingdom
## 358927      17321 United Kingdom
## 358931      17321 United Kingdom
## 358935      17321 United Kingdom
## 358944      17321 United Kingdom
## 358961      17321 United Kingdom
## 358972      17321 United Kingdom
## 359049      16205 United Kingdom
## 359382      12637         France
## 359386      12637         France
## 359394      12637         France
## 359396      12637         France
## 359397      12637         France
## 359399      12637         France
## 359709      13994 United Kingdom
## 359736      13994 United Kingdom
## 359751      13994 United Kingdom
## 359758      13994 United Kingdom
## 359762      13994 United Kingdom
## 359777      13994 United Kingdom
## 359778      13994 United Kingdom
## 361054      15529 United Kingdom
## 361055      15529 United Kingdom
## 361322      16360 United Kingdom
## 361415      16360 United Kingdom
## 361506      14515 United Kingdom
## 361511      14515 United Kingdom
## 361514      14515 United Kingdom
## 361826      14056 United Kingdom
## 361957      14332 United Kingdom
## 362076      16474 United Kingdom
## 362077      16474 United Kingdom
## 362085      16474 United Kingdom
## 362094      16474 United Kingdom
## 362113      16474 United Kingdom
## 362115      16474 United Kingdom
## 362116      16474 United Kingdom
## 362118      16474 United Kingdom
## 362121      16474 United Kingdom
## 362129      16474 United Kingdom
## 362133      16474 United Kingdom
## 362141      16474 United Kingdom
## 362199      16033 United Kingdom
## 362243      14506 United Kingdom
## 362283      14506 United Kingdom
## 362289      14506 United Kingdom
## 362304      14506 United Kingdom
## 362306      14506 United Kingdom
## 362311      14506 United Kingdom
## 362320      14506 United Kingdom
## 362322      14506 United Kingdom
## 362330      14506 United Kingdom
## 362332      14506 United Kingdom
## 362335      14506 United Kingdom
## 362336      14506 United Kingdom
## 362362      12512         Israel
## 362368      12512         Israel
## 362369      12512         Israel
## 362448      16242 United Kingdom
## 362569      16374 United Kingdom
## 363220      15276 United Kingdom
## 363228      15276 United Kingdom
## 363238      15276 United Kingdom
## 363993      12841 United Kingdom
## 364134      14534 United Kingdom
## 364143      14534 United Kingdom
## 364145      14534 United Kingdom
## 364146      14534 United Kingdom
## 364157      14534 United Kingdom
## 364163      14534 United Kingdom
## 364183      14534 United Kingdom
## 364458      14730 United Kingdom
## 364466      14730 United Kingdom
## 364472      14730 United Kingdom
## 364474      14730 United Kingdom
## 364481      14730 United Kingdom
## 364488      14730 United Kingdom
## 364495      14730 United Kingdom
## 364506      14730 United Kingdom
## 364511      14730 United Kingdom
## 364512      14730 United Kingdom
## 364514      14730 United Kingdom
## 364529      14730 United Kingdom
## 364559      14730 United Kingdom
## 364567      14730 United Kingdom
## 364576      14730 United Kingdom
## 364622      14730 United Kingdom
## 364625      14730 United Kingdom
## 364630      14730 United Kingdom
## 364632      14730 United Kingdom
## 364633      14730 United Kingdom
## 364644      14730 United Kingdom
## 364646      14730 United Kingdom
## 364647      14730 United Kingdom
## 364648      14730 United Kingdom
## 364655      14730 United Kingdom
## 364656      14730 United Kingdom
## 364785      17222 United Kingdom
## 365523      18033 United Kingdom
## 366144      16895 United Kingdom
## 366147      16895 United Kingdom
## 366152      16895 United Kingdom
## 366159      16895 United Kingdom
## 366164      16895 United Kingdom
## 366169      16895 United Kingdom
## 366170      16895 United Kingdom
## 366516      14449 United Kingdom
## 366529      14449 United Kingdom
## 366532      14449 United Kingdom
## 366544      14449 United Kingdom
## 366561      14449 United Kingdom
## 367000      12757       Portugal
## 367069      12757       Portugal
## 367090      12757       Portugal
## 367091      12757       Portugal
## 367133      12757       Portugal
## 367139      12757       Portugal
## 367164      12757       Portugal
## 367479      17813 United Kingdom
## 367533      17813 United Kingdom
## 367549      17813 United Kingdom
## 367555      17813 United Kingdom
## 367563      17813 United Kingdom
## 367568      17813 United Kingdom
## 367574      17813 United Kingdom
## 367585      17813 United Kingdom
## 367586      17813 United Kingdom
## 367593      17813 United Kingdom
## 367603      17813 United Kingdom
## 367608      17813 United Kingdom
## 367612      17813 United Kingdom
## 367614      17813 United Kingdom
## 367618      17813 United Kingdom
## 367629      17813 United Kingdom
## 367651      17813 United Kingdom
## 367653      17813 United Kingdom
## 367655      17813 United Kingdom
## 367660      17813 United Kingdom
## 367693      17813 United Kingdom
## 368038      12923 United Kingdom
## 368334      14592 United Kingdom
## 368578      12519        Germany
## 368634      14138 United Kingdom
## 368701      17841 United Kingdom
## 368704      17841 United Kingdom
## 368716      17841 United Kingdom
## 368732      17841 United Kingdom
## 368733      17841 United Kingdom
## 369224      18096 United Kingdom
## 369226      18096 United Kingdom
## 369231      18096 United Kingdom
## 369240      18096 United Kingdom
## 369246      18096 United Kingdom
## 369370      15719 United Kingdom
## 369582      12856 United Kingdom
## 369893      17596 United Kingdom
## 370041      17509 United Kingdom
## 370618      13755 United Kingdom
## 370631      13755 United Kingdom
## 370632      13755 United Kingdom
## 370634      13755 United Kingdom
## 370636      13755 United Kingdom
## 370638      13755 United Kingdom
## 370652      13755 United Kingdom
## 370659      13755 United Kingdom
## 370662      13755 United Kingdom
## 370677      13755 United Kingdom
## 370680      13755 United Kingdom
## 370707      13755 United Kingdom
## 370717      13755 United Kingdom
## 370720      13755 United Kingdom
## 370780      16104 United Kingdom
## 370811      16326 United Kingdom
## 370818      16326 United Kingdom
## 370820      16326 United Kingdom
## 370862      13259 United Kingdom
## 370868      13259 United Kingdom
## 370881      13259 United Kingdom
## 370882      13259 United Kingdom
## 370893      13259 United Kingdom
## 370910      13259 United Kingdom
## 370939      13558 United Kingdom
## 370994      12748 United Kingdom
## 371000      12748 United Kingdom
## 371002      12748 United Kingdom
## 371005      12748 United Kingdom
## 371036      16066 United Kingdom
## 371199      15787 United Kingdom
## 371218      15787 United Kingdom
## 371234      15787 United Kingdom
## 371235      15787 United Kingdom
## 371473      18088 United Kingdom
## 371480      18088 United Kingdom
## 371561      14040 United Kingdom
## 371573      14040 United Kingdom
## 371582      14040 United Kingdom
## 371618      17790 United Kingdom
## 371662      13193 United Kingdom
## 371665      13193 United Kingdom
## 371668      13193 United Kingdom
## 371670      13193 United Kingdom
## 371820      14801 United Kingdom
## 371854      14801 United Kingdom
## 371880      16380 United Kingdom
## 371911      14514 United Kingdom
## 371916      14514 United Kingdom
## 371923      14514 United Kingdom
## 371924      14514 United Kingdom
## 371978      16921 United Kingdom
## 371986      16921 United Kingdom
## 372008      16921 United Kingdom
## 372014      16921 United Kingdom
## 372015      16921 United Kingdom
## 372728      18126 United Kingdom
## 372742      18126 United Kingdom
## 372751      18126 United Kingdom
## 372762      18126 United Kingdom
## 372895      14719 United Kingdom
## 372956      16395 United Kingdom
## 372982      16395 United Kingdom
## 372987      16395 United Kingdom
## 373051      16776 United Kingdom
## 373058      16776 United Kingdom
## 373075      16776 United Kingdom
## 373079      16776 United Kingdom
## 373099      16776 United Kingdom
## 373174      17214 United Kingdom
## 373267      17841 United Kingdom
## 373280      17841 United Kingdom
## 373370      14451 United Kingdom
## 373374      14451 United Kingdom
## 373385      14451 United Kingdom
## 373408      14451 United Kingdom
## 373524      15553 United Kingdom
## 373609      16549 United Kingdom
## 373614      16549 United Kingdom
## 373839      14529 United Kingdom
## 373842      14529 United Kingdom
## 373876      14529 United Kingdom
## 373879      14529 United Kingdom
## 373887      14529 United Kingdom
## 373891      14529 United Kingdom
## 373894      14529 United Kingdom
## 373899      14529 United Kingdom
## 373910      14529 United Kingdom
## 373912      14529 United Kingdom
## 373913      14529 United Kingdom
## 373983      14535 United Kingdom
## 375264      15858 United Kingdom
## 375312      17965 United Kingdom
## 376268      16362 United Kingdom
## 376280      16362 United Kingdom
## 376645      12836 United Kingdom
## 376758      13969 United Kingdom
## 377084         NA United Kingdom
## 377404      16161 United Kingdom
## 377647      17913 United Kingdom
## 377870      17346 United Kingdom
## 378171      17841 United Kingdom
## 378173      17841 United Kingdom
## 378175      17841 United Kingdom
## 378177      17841 United Kingdom
## 378183      17841 United Kingdom
## 378189      17841 United Kingdom
## 378191      17841 United Kingdom
## 378192      17841 United Kingdom
## 378278      15831 United Kingdom
## 378299      15831 United Kingdom
## 378490      17676 United Kingdom
## 379520      17509 United Kingdom
## 379798      16770 United Kingdom
## 379915      13827 United Kingdom
## 380145      16121 United Kingdom
## 380157      16121 United Kingdom
## 380161      16121 United Kingdom
## 380201      16121 United Kingdom
## 380215      16121 United Kingdom
## 380332      18096 United Kingdom
## 380345      18096 United Kingdom
## 380351      18096 United Kingdom
## 380355      18096 United Kingdom
## 380362      18096 United Kingdom
## 380378      18096 United Kingdom
## 380381      18096 United Kingdom
## 380392      18096 United Kingdom
## 380460      14234 United Kingdom
## 380465      14234 United Kingdom
## 380468      14234 United Kingdom
## 380470      14234 United Kingdom
## 380483      14234 United Kingdom
## 380491      14234 United Kingdom
## 380494      14234 United Kingdom
## 380503      14234 United Kingdom
## 380560      14234 United Kingdom
## 380566      14234 United Kingdom
## 380567      14234 United Kingdom
## 380568      14234 United Kingdom
## 380789         NA United Kingdom
## 380996      16775 United Kingdom
## 381236      17841 United Kingdom
## 381336      17614 United Kingdom
## 381359      17614 United Kingdom
## 381626      14856 United Kingdom
## 381723      14089 United Kingdom
## 381843      14796 United Kingdom
## 382229      12856 United Kingdom
## 382357      16081 United Kingdom
## 382364      16081 United Kingdom
## 382373      16081 United Kingdom
## 382403      16081 United Kingdom
## 382612      15453 United Kingdom
## 382625      15453 United Kingdom
## 382788      14592 United Kingdom
## 382813      14592 United Kingdom
## 382814      14592 United Kingdom
## 382815      14592 United Kingdom
## 382816      14592 United Kingdom
## 383299      16674 United Kingdom
## 383315      16674 United Kingdom
## 383316      16674 United Kingdom
## 383379      15351 United Kingdom
## 383450      12940 United Kingdom
## 383456      12940 United Kingdom
## 383469      12940 United Kingdom
## 383535      13878 United Kingdom
## 383622      16934 United Kingdom
## 383629      15994 United Kingdom
## 383630      15994 United Kingdom
## 383654      15994 United Kingdom
## 383753      16466 United Kingdom
## 383960      15545 United Kingdom
## 384102      14547 United Kingdom
## 384115      14547 United Kingdom
## 384117      14547 United Kingdom
## 384118      14547 United Kingdom
## 384119      14547 United Kingdom
## 384171      14547 United Kingdom
## 384172      14547 United Kingdom
## 384274      15113 United Kingdom
## 384278      15113 United Kingdom
## 384282      15113 United Kingdom
## 384316      13610 United Kingdom
## 384318      13610 United Kingdom
## 384343      13610 United Kingdom
## 384876      17377 United Kingdom
## 384877      17377 United Kingdom
## 384878      17377 United Kingdom
## 385121      17201 United Kingdom
## 385131      17201 United Kingdom
## 385242      15012 United Kingdom
## 385246      15012 United Kingdom
## 385256      15012 United Kingdom
## 385262      15012 United Kingdom
## 385340      16412 United Kingdom
## 385353      16412 United Kingdom
## 385356      16412 United Kingdom
## 385365      16412 United Kingdom
## 385368      16412 United Kingdom
## 385417      15335 United Kingdom
## 385498      13015 United Kingdom
## 386072      17049 United Kingdom
## 386229      16932 United Kingdom
## 386234      16932 United Kingdom
## 386235      16932 United Kingdom
## 386241      16932 United Kingdom
## 386248      16932 United Kingdom
## 386296      14805 United Kingdom
## 386321      14830 United Kingdom
## 386436      15033 United Kingdom
## 386621      17841 United Kingdom
## 386751      14422 United Kingdom
## 387722      17203 United Kingdom
## 387961      18118 United Kingdom
## 388036      16393 United Kingdom
## 388204      14554 United Kingdom
## 388217      14554 United Kingdom
## 388219      14554 United Kingdom
## 388220      14554 United Kingdom
## 388277      17758 United Kingdom
## 388286      17758 United Kingdom
## 388300      17758 United Kingdom
## 388640      14159 United Kingdom
## 388757      14179 United Kingdom
## 388779      14179 United Kingdom
## 388780      14179 United Kingdom
## 388802      14179 United Kingdom
## 388812      14179 United Kingdom
## 388814      14179 United Kingdom
## 390447      12748 United Kingdom
## 390457      12748 United Kingdom
## 390656      15039 United Kingdom
## 390657      15039 United Kingdom
## 390875      16470 United Kingdom
## 390889      16470 United Kingdom
## 390894      16470 United Kingdom
## 390895      16470 United Kingdom
## 390908      16470 United Kingdom
## 390928      16470 United Kingdom
## 391020      17625 United Kingdom
## 391084      16869 United Kingdom
## 391124      17841 United Kingdom
## 391139      17841 United Kingdom
## 391157      17841 United Kingdom
## 391158      17841 United Kingdom
## 391445      14704 United Kingdom
## 391474      14704 United Kingdom
## 391475      14704 United Kingdom
## 391481      14704 United Kingdom
## 391489      14704 United Kingdom
## 391493      14704 United Kingdom
## 391506      14704 United Kingdom
## 391507      14704 United Kingdom
## 391599      16885 United Kingdom
## 391614      16885 United Kingdom
## 391685      15006 United Kingdom
## 391698      15006 United Kingdom
## 391705      15006 United Kingdom
## 391716      15006 United Kingdom
## 391723      15006 United Kingdom
## 391736      15006 United Kingdom
## 391739      15006 United Kingdom
## 391743      15006 United Kingdom
## 391772      15006 United Kingdom
## 391773      15006 United Kingdom
## 391783      15006 United Kingdom
## 391785      15006 United Kingdom
## 391922      17350 United Kingdom
## 392457      17238 United Kingdom
## 392560      17764 United Kingdom
## 392586      17764 United Kingdom
## 393094      17346 United Kingdom
## 393153      17346 United Kingdom
## 393236      18252 United Kingdom
## 393240      18252 United Kingdom
## 393250      18252 United Kingdom
## 393266      18252 United Kingdom
## 393590      13263 United Kingdom
## 393616      16284 United Kingdom
## 393645      16284 United Kingdom
## 393649      16284 United Kingdom
## 393902      13573 United Kingdom
## 393939      17125 United Kingdom
## 393941      17125 United Kingdom
## 393960      17125 United Kingdom
## 393963      17125 United Kingdom
## 393964      17125 United Kingdom
## 393993      15511 United Kingdom
## 394007      15511 United Kingdom
## 394134      17571 United Kingdom
## 394147      17571 United Kingdom
## 394154      17571 United Kingdom
## 394155      17571 United Kingdom
## 394156      17571 United Kingdom
## 394157      17571 United Kingdom
## 394158      17571 United Kingdom
## 394159      17571 United Kingdom
## 394210      17571 United Kingdom
## 394230      17571 United Kingdom
## 394255      17571 United Kingdom
## 394256      17571 United Kingdom
## 394270      17571 United Kingdom
## 394281      17571 United Kingdom
## 394283      17571 United Kingdom
## 394287      17571 United Kingdom
## 394295      17571 United Kingdom
## 394297      17571 United Kingdom
## 394298      17571 United Kingdom
## 394304      17571 United Kingdom
## 394312      17571 United Kingdom
## 394314      17571 United Kingdom
## 394323      17571 United Kingdom
## 394324      17571 United Kingdom
## 394328      17571 United Kingdom
## 394330      17571 United Kingdom
## 394332      17571 United Kingdom
## 394793      18118 United Kingdom
## 394803      18118 United Kingdom
## 395242      17463 United Kingdom
## 395243      17463 United Kingdom
## 395432      15051 United Kingdom
## 395488      14329 United Kingdom
## 395844      16007 United Kingdom
## 396057      16744 United Kingdom
## 396069      14698 United Kingdom
## 396076      14698 United Kingdom
## 396235      16931 United Kingdom
## 396430      16686 United Kingdom
## 396432      16686 United Kingdom
## 396436      16686 United Kingdom
## 396446      16686 United Kingdom
## 396482      16686 United Kingdom
## 396502      16686 United Kingdom
## 396534      13598 United Kingdom
## 396537      13598 United Kingdom
## 396541      13598 United Kingdom
## 396542      13598 United Kingdom
## 396547      13598 United Kingdom
## 396586      18005 United Kingdom
## 396591      18005 United Kingdom
## 396597      16794 United Kingdom
## 396668      15427 United Kingdom
## 396701      15427 United Kingdom
## 396703      15427 United Kingdom
## 396831      17841 United Kingdom
## 396899      16905 United Kingdom
## 396900      16905 United Kingdom
## 397018      14432 United Kingdom
## 397036      14432 United Kingdom
## 397139      15022 United Kingdom
## 397156      15022 United Kingdom
## 397158      15022 United Kingdom
## 397164      15022 United Kingdom
## 397168      15022 United Kingdom
## 397178      15022 United Kingdom
## 397179      15022 United Kingdom
## 397182      15022 United Kingdom
## 397216      17111 United Kingdom
## 397330      14629 United Kingdom
## 397355      15436 United Kingdom
## 397376      15436 United Kingdom
## 397378      15436 United Kingdom
## 397379      15436 United Kingdom
## 397383      15436 United Kingdom
## 397391      15436 United Kingdom
## 397393      15436 United Kingdom
## 397405      15436 United Kingdom
## 397411      15436 United Kingdom
## 397420      15436 United Kingdom
## 397421      15436 United Kingdom
## 397432      15436 United Kingdom
## 397433      15436 United Kingdom
## 397441      15436 United Kingdom
## 397629      16426 United Kingdom
## 397663      16426 United Kingdom
## 397664      16426 United Kingdom
## 397683      16426 United Kingdom
## 397685      16426 United Kingdom
## 397828      14607 United Kingdom
## 397829      14607 United Kingdom
## 397830      14607 United Kingdom
## 397831      14607 United Kingdom
## 397832      14607 United Kingdom
## 398151      17344 United Kingdom
## 398285      15271 United Kingdom
## 398288      15271 United Kingdom
## 398295      15271 United Kingdom
## 398317      15271 United Kingdom
## 398333      15271 United Kingdom
## 398340      15271 United Kingdom
## 398624      16728 United Kingdom
## 398671      16728 United Kingdom
## 398681      16728 United Kingdom
## 398690      16728 United Kingdom
## 398693      16728 United Kingdom
## 398789      15046 United Kingdom
## 398841      13176 United Kingdom
## 398873      13176 United Kingdom
## 398874      13176 United Kingdom
## 398883      13176 United Kingdom
## 398895      13176 United Kingdom
## 399674         NA United Kingdom
## 400748      15506 United Kingdom
## 400750      15506 United Kingdom
## 400947      15861 United Kingdom
## 401104      15443 United Kingdom
## 401110      15443 United Kingdom
## 401120      15443 United Kingdom
## 401140      15443 United Kingdom
## 401220      18045 United Kingdom
## 401229      18045 United Kingdom
## 401236      18045 United Kingdom
## 401237      18045 United Kingdom
## 401279      16549 United Kingdom
## 401317      16549 United Kingdom
## 401452      17917 United Kingdom
## 401517      17596 United Kingdom
## 401528      17596 United Kingdom
## 401546      17596 United Kingdom
## 401818      16110 United Kingdom
## 402039      16056 United Kingdom
## 402075      16056 United Kingdom
## 402123      18079 United Kingdom
## 402132      18079 United Kingdom
## 402136      18079 United Kingdom
## 402157      18079 United Kingdom
## 402258      14341 United Kingdom
## 403064      12748 United Kingdom
## 403065      12748 United Kingdom
## 403066      12748 United Kingdom
## 403324      13571 United Kingdom
## 403355      16418 United Kingdom
## 403365      16418 United Kingdom
## 403366      16418 United Kingdom
## 403368      16418 United Kingdom
## 403370      16418 United Kingdom
## 403371      16418 United Kingdom
## 403372      16418 United Kingdom
## 403402      14102 United Kingdom
## 403407      14102 United Kingdom
## 403408      14102 United Kingdom
## 403409      14102 United Kingdom
## 403412      14102 United Kingdom
## 403413      14102 United Kingdom
## 403414      14102 United Kingdom
## 403416      14102 United Kingdom
## 403417      14102 United Kingdom
## 403418      14102 United Kingdom
## 403420      14102 United Kingdom
## 403422      14102 United Kingdom
## 403423      14102 United Kingdom
## 403425      14102 United Kingdom
## 403426      14102 United Kingdom
## 403428      14102 United Kingdom
## 403431      14102 United Kingdom
## 403432      14102 United Kingdom
## 403726      16415 United Kingdom
## 403730      16415 United Kingdom
## 403742      16415 United Kingdom
## 403750      16415 United Kingdom
## 403751      16415 United Kingdom
## 403763      16415 United Kingdom
## 403764      16415 United Kingdom
## 403922      12748 United Kingdom
## 403940      12748 United Kingdom
## 404284      14690 United Kingdom
## 404415      16345 United Kingdom
## 404525      15993 United Kingdom
## 404545      15993 United Kingdom
## 404718      17895 United Kingdom
## 405381      14971 United Kingdom
## 405383      14971 United Kingdom
## 405404      14971 United Kingdom
## 405551      17545 United Kingdom
## 405555      17545 United Kingdom
## 405609      17545 United Kingdom
## 405756      17545 United Kingdom
## 405933      13735 United Kingdom
## 405967      18283 United Kingdom
## 405968      18283 United Kingdom
## 406040      15707 United Kingdom
## 406042      15707 United Kingdom
## 406317      14357 United Kingdom
## 406840      14716 United Kingdom
## 406841      14716 United Kingdom
## 406845      14716 United Kingdom
## 406877      18035 United Kingdom
## 406920      18035 United Kingdom
## 407006      15014 United Kingdom
## 407007      15014 United Kingdom
## 407034      17602 United Kingdom
## 407071      17602 United Kingdom
## 407106      17602 United Kingdom
## 407121      17602 United Kingdom
## 407122      17602 United Kingdom
## 407123      17602 United Kingdom
## 407125      17602 United Kingdom
## 407126      17602 United Kingdom
## 407173      17530 United Kingdom
## 407815      14415 United Kingdom
## 407953      16764 United Kingdom
## 408129      14606 United Kingdom
## 408216         NA    Switzerland
## 408232         NA    Switzerland
## 408243         NA    Switzerland
## 408255         NA    Switzerland
## 408359         NA    Switzerland
## 408482      16049 United Kingdom
## 408489      16049 United Kingdom
## 408521      16049 United Kingdom
## 408542      16049 United Kingdom
## 408544      16049 United Kingdom
## 408555      16049 United Kingdom
## 408556      16049 United Kingdom
## 408601      17837 United Kingdom
## 408603      17837 United Kingdom
## 408604      17837 United Kingdom
## 408746      17839 United Kingdom
## 408748      17839 United Kingdom
## 408749      17839 United Kingdom
## 408763      17839 United Kingdom
## 408856      15708 United Kingdom
## 408958      16601 United Kingdom
## 409011      16923 United Kingdom
## 409012      16923 United Kingdom
## 409021      16923 United Kingdom
## 409306      14159 United Kingdom
## 409386      14159 United Kingdom
## 409555      14179 United Kingdom
## 409562      14179 United Kingdom
## 409656      17255 United Kingdom
## 409665      17255 United Kingdom
## 409682      17255 United Kingdom
## 409696      13137 United Kingdom
## 409748      13137 United Kingdom
## 409996      14178 United Kingdom
## 410033      15748 United Kingdom
## 410063      14456 United Kingdom
## 410065      14456 United Kingdom
## 410079      14456 United Kingdom
## 410326      14507 United Kingdom
## 410341      16049 United Kingdom
## 410363      16049 United Kingdom
## 410365      16049 United Kingdom
## 410432      14684 United Kingdom
## 410436      14684 United Kingdom
## 410439      14684 United Kingdom
## 410451      14684 United Kingdom
## 410460      14684 United Kingdom
## 410466      14684 United Kingdom
## 410486      14684 United Kingdom
## 410600      14653 United Kingdom
## 410601      14653 United Kingdom
## 410702      14572 United Kingdom
## 410806      15478 United Kingdom
## 410808      15478 United Kingdom
## 410844      13421 United Kingdom
## 410854      13421 United Kingdom
## 411087      14723 United Kingdom
## 411088      14723 United Kingdom
## 411125      14723 United Kingdom
## 411126      14723 United Kingdom
## 411155      15547 United Kingdom
## 411480      15444 United Kingdom
## 411496      15444 United Kingdom
## 411500      15444 United Kingdom
## 411506      15444 United Kingdom
## 411527      15444 United Kingdom
## 411549      16877 United Kingdom
## 411566      16877 United Kingdom
## 411573      16877 United Kingdom
## 411655      13607 United Kingdom
## 412048      13544 United Kingdom
## 412050      13544 United Kingdom
## 412271      18055 United Kingdom
## 412279      18055 United Kingdom
## 412503      17777 United Kingdom
## 412504      17777 United Kingdom
## 415189      17377 United Kingdom
## 415475      14995 United Kingdom
## 415621      14485 United Kingdom
## 415673      17243 United Kingdom
## 415758      16360 United Kingdom
## 415777      16360 United Kingdom
## 415788      16360 United Kingdom
## 415835      16360 United Kingdom
## 415843      16360 United Kingdom
## 415848      16360 United Kingdom
## 415890      16360 United Kingdom
## 415896      16360 United Kingdom
## 416105      16729 United Kingdom
## 416141      16729 United Kingdom
## 416168      14562 United Kingdom
## 416261      14505 United Kingdom
## 416393      14505 United Kingdom
## 416489      17813 United Kingdom
## 416507      17813 United Kingdom
## 417142      15576 United Kingdom
## 417153      15576 United Kingdom
## 417256      12748 United Kingdom
## 417330      17754 United Kingdom
## 417334      17754 United Kingdom
## 417422      17841 United Kingdom
## 417526      14974 United Kingdom
## 417533      14974 United Kingdom
## 417534      14974 United Kingdom
## 417536      14974 United Kingdom
## 417662      15743 United Kingdom
## 417673      15743 United Kingdom
## 417751      14102 United Kingdom
## 418024      13271 United Kingdom
## 418041      13271 United Kingdom
## 418068      13271 United Kingdom
## 418069      13271 United Kingdom
## 418070      13271 United Kingdom
## 418073      13271 United Kingdom
## 418074      13271 United Kingdom
## 418083      13271 United Kingdom
## 418088      13271 United Kingdom
## 419104      17999 United Kingdom
## 419129      17999 United Kingdom
## 419157      17595 United Kingdom
## 419191      16348 United Kingdom
## 419760      16221 United Kingdom
## 419763      16221 United Kingdom
## 419973      15998 United Kingdom
## 420033      16347 United Kingdom
## 420174      16891 United Kingdom
## 420178      16891 United Kingdom
## 420206      16891 United Kingdom
## 420213      16891 United Kingdom
## 420219      16891 United Kingdom
## 420487      14723 United Kingdom
## 420499      14723 United Kingdom
## 420500      14723 United Kingdom
## 420527      14723 United Kingdom
## 420548      17750 United Kingdom
## 420581      17403 United Kingdom
## 420589      16914 United Kingdom
## 420599      16914 United Kingdom
## 420600      16914 United Kingdom
## 420604      16914 United Kingdom
## 420610      16914 United Kingdom
## 420613      16914 United Kingdom
## 420618      16914 United Kingdom
## 420622      16914 United Kingdom
## 421211      14428 United Kingdom
## 421233      14428 United Kingdom
## 421234      14428 United Kingdom
## 421236      14428 United Kingdom
## 421242      14428 United Kingdom
## 421243      14428 United Kingdom
## 421245      14428 United Kingdom
## 421429      13467 United Kingdom
## 421471      15640 United Kingdom
## 421629      16016 United Kingdom
## 421630      16016 United Kingdom
## 422042      17377 United Kingdom
## 422189      17348 United Kingdom
## 422554      17979 United Kingdom
## 422566      17979 United Kingdom
## 422574      17979 United Kingdom
## 422578      17979 United Kingdom
## 422581      17979 United Kingdom
## 422641      17203 United Kingdom
## 422650      17203 United Kingdom
## 422680      15453 United Kingdom
## 422755      17203 United Kingdom
## 422781      18035 United Kingdom
## 422783      18035 United Kingdom
## 422834      18022 United Kingdom
## 422848      18022 United Kingdom
## 422857      18022 United Kingdom
## 422864      18022 United Kingdom
## 422867      18022 United Kingdom
## 422872      18022 United Kingdom
## 422873      18022 United Kingdom
## 422874      18022 United Kingdom
## 422875      18022 United Kingdom
## 422891      18022 United Kingdom
## 422892      18022 United Kingdom
## 422900      18022 United Kingdom
## 422903      18022 United Kingdom
## 422914      18022 United Kingdom
## 422919      18022 United Kingdom
## 422920      18022 United Kingdom
## 422924      18022 United Kingdom
## 422926      18022 United Kingdom
## 422928      18022 United Kingdom
## 422932      18022 United Kingdom
## 422933      18022 United Kingdom
## 422936      18022 United Kingdom
## 422944      18022 United Kingdom
## 422950      18022 United Kingdom
## 422955      18022 United Kingdom
## 422957      18022 United Kingdom
## 423000      18022 United Kingdom
## 423150      17274 United Kingdom
## 423151      17274 United Kingdom
## 423177      12577         France
## 423353      16887 United Kingdom
## 423610      15707 United Kingdom
## 423611      15707 United Kingdom
## 423614      15707 United Kingdom
## 423626      15707 United Kingdom
## 423628      15707 United Kingdom
## 423691      17084 United Kingdom
## 423692      17084 United Kingdom
## 423708      17084 United Kingdom
## 423716      17084 United Kingdom
## 423726      17084 United Kingdom
## 423745      17084 United Kingdom
## 423756      17084 United Kingdom
## 423764      17084 United Kingdom
## 423766      17084 United Kingdom
## 423784      17084 United Kingdom
## 423788      17084 United Kingdom
## 423792      17084 United Kingdom
## 423794      17084 United Kingdom
## 423849      17841 United Kingdom
## 423896      17841 United Kingdom
## 423898      17841 United Kingdom
## 423973      12484          Spain
## 424001      16426 United Kingdom
## 424002      16426 United Kingdom
## 424071      14056 United Kingdom
## 424077      14056 United Kingdom
## 424522      14971 United Kingdom
## 424538      14971 United Kingdom
## 424645      15952 United Kingdom
## 424666      15952 United Kingdom
## 424674      17769 United Kingdom
## 424718      16326 United Kingdom
## 424728      16326 United Kingdom
## 424740      17387 United Kingdom
## 424756      17387 United Kingdom
## 424883      13772 United Kingdom
## 424894      13772 United Kingdom
## 424899      13772 United Kingdom
## 424939      16942 United Kingdom
## 424974      15407 United Kingdom
## 425001      15407 United Kingdom
## 425012      15407 United Kingdom
## 425019      15407 United Kingdom
## 425025      15407 United Kingdom
## 425109      13527 United Kingdom
## 425123      13527 United Kingdom
## 425132      14482 United Kingdom
## 425164      15514 United Kingdom
## 425214      12838 United Kingdom
## 425231      12838 United Kingdom
## 425243      12838 United Kingdom
## 425483      17289 United Kingdom
## 425494      17289 United Kingdom
## 425512      17289 United Kingdom
## 425514      17289 United Kingdom
## 425802      14963 United Kingdom
## 425815      14963 United Kingdom
## 425816      14963 United Kingdom
## 425818      14963 United Kingdom
## 425819      14963 United Kingdom
## 425868      16372 United Kingdom
## 425887      16372 United Kingdom
## 425895      16372 United Kingdom
## 425903      16372 United Kingdom
## 425922      16372 United Kingdom
## 426000      17608 United Kingdom
## 426001      17608 United Kingdom
## 426024      17608 United Kingdom
## 426366      16033 United Kingdom
## 426367      16033 United Kingdom
## 426404      16033 United Kingdom
## 426454      15426 United Kingdom
## 426458      15426 United Kingdom
## 426480      15426 United Kingdom
## 426527      15696 United Kingdom
## 426544      15696 United Kingdom
## 426694      17768 United Kingdom
## 426706      17768 United Kingdom
## 426710      17768 United Kingdom
## 426713      17768 United Kingdom
## 426714      17768 United Kingdom
## 426739      15427 United Kingdom
## 426740      15427 United Kingdom
## 426790      15427 United Kingdom
## 426838      15427 United Kingdom
## 426840      15427 United Kingdom
## 426841      15427 United Kingdom
## 426859      15427 United Kingdom
## 426865      15427 United Kingdom
## 426912      15427 United Kingdom
## 426954      15427 United Kingdom
## 426955      15427 United Kingdom
## 426969      14502 United Kingdom
## 427058      14547 United Kingdom
## 427059      14547 United Kingdom
## 427144      17920 United Kingdom
## 427164      17920 United Kingdom
## 427237      14502 United Kingdom
## 427263      14502 United Kingdom
## 427310      14664 United Kingdom
## 427511      15025 United Kingdom
## 427518      15025 United Kingdom
## 427520      15025 United Kingdom
## 427539      15025 United Kingdom
## 427544      15025 United Kingdom
## 427810      15993 United Kingdom
## 427818      15993 United Kingdom
## 427820      15993 United Kingdom
## 427841      15993 United Kingdom
## 427842      15993 United Kingdom
## 427916      15351 United Kingdom
## 428002      15150 United Kingdom
## 428111      15870 United Kingdom
## 428140      15870 United Kingdom
## 428341      15493 United Kingdom
## 428436      12748 United Kingdom
## 428438      12748 United Kingdom
## 428514      15493 United Kingdom
## 428516      15493 United Kingdom
## 428519      15493 United Kingdom
## 428798      15719 United Kingdom
## 428890      14387 United Kingdom
## 428916      12748 United Kingdom
## 429129      13599 United Kingdom
## 429250      14700 United Kingdom
## 429254      14700 United Kingdom
## 429285      18036 United Kingdom
## 429329      17014 United Kingdom
## 429373      16242 United Kingdom
## 429511      13673 United Kingdom
## 429515      13673 United Kingdom
## 429525      13673 United Kingdom
## 429527      13673 United Kingdom
## 429530      13673 United Kingdom
## 429587      17109 United Kingdom
## 430548      17886 United Kingdom
## 430554      17886 United Kingdom
## 430579      17886 United Kingdom
## 430585      17886 United Kingdom
## 430586      17886 United Kingdom
## 430726      17964 United Kingdom
## 430732      17964 United Kingdom
## 430743      17964 United Kingdom
## 430744      17964 United Kingdom
## 430749      17964 United Kingdom
## 430750      17964 United Kingdom
## 430864      17870 United Kingdom
## 430980      15573 United Kingdom
## 430982      15573 United Kingdom
## 430990      15573 United Kingdom
## 430998      15573 United Kingdom
## 431002      15573 United Kingdom
## 431143      17289 United Kingdom
## 431164      15039 United Kingdom
## 431289      14071 United Kingdom
## 431408      16764 United Kingdom
## 431456      16764 United Kingdom
## 431591      17841 United Kingdom
## 431640      17841 United Kingdom
## 431703      13975 United Kingdom
## 431704      13975 United Kingdom
## 431807      13975 United Kingdom
## 431889      18123 United Kingdom
## 431892      18123 United Kingdom
## 431901      12849 United Kingdom
## 431989      16549 United Kingdom
## 432001      16549 United Kingdom
## 432010      16549 United Kingdom
## 432012      16549 United Kingdom
## 432020      16549 United Kingdom
## 432022      16549 United Kingdom
## 432153      12748 United Kingdom
## 432156      12748 United Kingdom
## 432158      12748 United Kingdom
## 432159      12748 United Kingdom
## 432160      12748 United Kingdom
## 432161      12748 United Kingdom
## 432162      12748 United Kingdom
## 432163      12748 United Kingdom
## 432164      12748 United Kingdom
## 432169      12748 United Kingdom
## 432181      12748 United Kingdom
## 432184      12748 United Kingdom
## 432197      12748 United Kingdom
## 432199      12748 United Kingdom
## 432201      12748 United Kingdom
## 432211      12748 United Kingdom
## 432220      12748 United Kingdom
## 432222      12748 United Kingdom
## 432223      12748 United Kingdom
## 432228      12748 United Kingdom
## 432242      12748 United Kingdom
## 432874      16284 United Kingdom
## 432879      16284 United Kingdom
## 432883      16284 United Kingdom
## 434283      17377 United Kingdom
## 434354      18109 United Kingdom
## 434530      16880 United Kingdom
## 434549      16880 United Kingdom
## 434582      13623 United Kingdom
## 434584      13623 United Kingdom
## 434769      12893 United Kingdom
## 434773      12893 United Kingdom
## 434776      12893 United Kingdom
## 434955      17293 United Kingdom
## 434956      17293 United Kingdom
## 434973      17293 United Kingdom
## 435212      17867 United Kingdom
## 435219      17867 United Kingdom
## 435220      17867 United Kingdom
## 435224      17867 United Kingdom
## 435228      17867 United Kingdom
## 435236      17867 United Kingdom
## 435243      17867 United Kingdom
## 435244      17867 United Kingdom
## 435245      17867 United Kingdom
## 435258      17867 United Kingdom
## 435259      17867 United Kingdom
## 435446      14482 United Kingdom
## 435449      14482 United Kingdom
## 435453      14482 United Kingdom
## 435472      14482 United Kingdom
## 435473      14482 United Kingdom
## 435481      14482 United Kingdom
## 435646      15046 United Kingdom
## 436283      15916 United Kingdom
## 436294      15916 United Kingdom
## 436479      15531 United Kingdom
## 436491      15531 United Kingdom
## 436503      15531 United Kingdom
## 436504      15531 United Kingdom
## 436506      15531 United Kingdom
## 436577      15531 United Kingdom
## 436578      15531 United Kingdom
## 436579      15531 United Kingdom
## 437102      14562 United Kingdom
## 437117      12682         France
## 437175      14606 United Kingdom
## 437241      14456 United Kingdom
## 437268      14456 United Kingdom
## 437278      14456 United Kingdom
## 437290      14456 United Kingdom
## 437296      14456 United Kingdom
## 437297      14456 United Kingdom
## 437299      14456 United Kingdom
## 437508      17059 United Kingdom
## 438177      16892 United Kingdom
## 438220      14064 United Kingdom
## 438221      14064 United Kingdom
## 438340      15184 United Kingdom
## 438609      16434 United Kingdom
## 438732      12617         France
## 438743      18283 United Kingdom
## 438746      18283 United Kingdom
## 438757      18283 United Kingdom
## 438932      16903 United Kingdom
## 438936      16903 United Kingdom
## 438952      16903 United Kingdom
## 438958      16903 United Kingdom
## 439170      12508         France
## 439203      12748 United Kingdom
## 439226      12748 United Kingdom
## 439381      14713 United Kingdom
## 439628      16791 United Kingdom
## 439658      16791 United Kingdom
## 439763      13230 United Kingdom
## 439764      13230 United Kingdom
## 440551      17841 United Kingdom
## 440559      17841 United Kingdom
## 440569      17841 United Kingdom
## 440570      17841 United Kingdom
## 440593      17841 United Kingdom
## 440611      17295 United Kingdom
## 440664      18118 United Kingdom
## 440727      15965 United Kingdom
## 440739      15965 United Kingdom
## 440743      15965 United Kingdom
## 440755      15965 United Kingdom
## 440772      15965 United Kingdom
## 440776      15965 United Kingdom
## 440778      15965 United Kingdom
## 440792      15965 United Kingdom
## 440795      15965 United Kingdom
## 440799      15965 United Kingdom
## 440800      15965 United Kingdom
## 440895      17348 United Kingdom
## 440965      12748 United Kingdom
## 440975      12748 United Kingdom
## 441144      14446 United Kingdom
## 441151      14446 United Kingdom
## 441152      14446 United Kingdom
## 441376      14662 United Kingdom
## 441377      14662 United Kingdom
## 441398      14662 United Kingdom
## 441399      14662 United Kingdom
## 441403      14662 United Kingdom
## 441414      14662 United Kingdom
## 441510      14125 United Kingdom
## 441564      16386 United Kingdom
## 441566      16386 United Kingdom
## 441590      16386 United Kingdom
## 441613      16386 United Kingdom
## 441620      16386 United Kingdom
## 441622      16386 United Kingdom
## 441635      16386 United Kingdom
## 441807      15557 United Kingdom
## 442468      12517        Germany
## 442469      12517        Germany
## 442494      12517        Germany
## 442611      17052 United Kingdom
## 442622      17052 United Kingdom
## 442642      17052 United Kingdom
## 442643      17052 United Kingdom
## 442645      17052 United Kingdom
## 442646      17052 United Kingdom
## 442647      17052 United Kingdom
## 442649      17052 United Kingdom
## 442659      17052 United Kingdom
## 442836      18014 United Kingdom
## 442843      18014 United Kingdom
## 443713         NA United Kingdom
## 443854      17838 United Kingdom
## 443868      17041 United Kingdom
## 444035      17920 United Kingdom
## 444038      17920 United Kingdom
## 444295      16983 United Kingdom
## 444297      16983 United Kingdom
## 444299      16983 United Kingdom
## 444370      16015 United Kingdom
## 444478      13170 United Kingdom
## 444500      13170 United Kingdom
## 444580      14547 United Kingdom
## 444861      14499 United Kingdom
## 444890      14499 United Kingdom
## 444960      17287 United Kingdom
## 444969      17287 United Kingdom
## 445123      17841 United Kingdom
## 445126      17841 United Kingdom
## 445127      17841 United Kingdom
## 445145      17841 United Kingdom
## 445148      17841 United Kingdom
## 445226      14698 United Kingdom
## 445233      14698 United Kingdom
## 445241      14698 United Kingdom
## 445246      14698 United Kingdom
## 445254      14698 United Kingdom
## 445289      17218 United Kingdom
## 445376      15022 United Kingdom
## 445400      15787 United Kingdom
## 445488      16726 United Kingdom
## 445491      16726 United Kingdom
## 445589      15787 United Kingdom
## 445648      15861 United Kingdom
## 445703      15411 United Kingdom
## 445795      12867 United Kingdom
## 445936      15005 United Kingdom
## 445990      16898 United Kingdom
## 446138      18069 United Kingdom
## 446151      18069 United Kingdom
## 446195      18069 United Kingdom
## 446196      18069 United Kingdom
## 446328      15861 United Kingdom
## 446350      14382 United Kingdom
## 446430      14382 United Kingdom
## 446444      14382 United Kingdom
## 446447      14382 United Kingdom
## 446469      14382 United Kingdom
## 446481      16720 United Kingdom
## 446492      16720 United Kingdom
## 447062      16936 United Kingdom
## 447123      15572 United Kingdom
## 447146      15572 United Kingdom
## 447389      14606 United Kingdom
## 447467      18082 United Kingdom
## 447479      18082 United Kingdom
## 447481      18082 United Kingdom
## 447522      18117 United Kingdom
## 447528      18117 United Kingdom
## 447610      17081 United Kingdom
## 447697      15033 United Kingdom
## 447734      15033 United Kingdom
## 447738      15033 United Kingdom
## 447777      13755 United Kingdom
## 447788      13755 United Kingdom
## 447790      13755 United Kingdom
## 447804      13755 United Kingdom
## 447812      13755 United Kingdom
## 447813      13755 United Kingdom
## 447875      17566 United Kingdom
## 447895      17566 United Kingdom
## 447896      17566 United Kingdom
## 447905      17566 United Kingdom
## 447925      17811 United Kingdom
## 447947      17811 United Kingdom
## 447962      17811 United Kingdom
## 447976      17811 United Kingdom
## 447977      17811 United Kingdom
## 447993      17811 United Kingdom
## 447996      17811 United Kingdom
## 448170      15993 United Kingdom
## 448252      17793 United Kingdom
## 448256      17793 United Kingdom
## 448264      17793 United Kingdom
## 448271      17793 United Kingdom
## 448272      17793 United Kingdom
## 448279      17793 United Kingdom
## 448303      15058 United Kingdom
## 448325      15058 United Kingdom
## 448343      15058 United Kingdom
## 448352      15058 United Kingdom
## 448355      15058 United Kingdom
## 448382      15532 United Kingdom
## 448429      15532 United Kingdom
## 448503      14953 United Kingdom
## 448576      16504 United Kingdom
## 448632      16504 United Kingdom
## 448647      16504 United Kingdom
## 449972      15009 United Kingdom
## 450639      17974 United Kingdom
## 450645      17974 United Kingdom
## 450646      17974 United Kingdom
## 450648      17974 United Kingdom
## 450652      17974 United Kingdom
## 450654      17974 United Kingdom
## 450655      17974 United Kingdom
## 450657      17974 United Kingdom
## 450658      17974 United Kingdom
## 450662      17974 United Kingdom
## 450663      17974 United Kingdom
## 450675      17974 United Kingdom
## 450868      16361 United Kingdom
## 450877      16361 United Kingdom
## 450901      14467 United Kingdom
## 450941      14725 United Kingdom
## 450943      14725 United Kingdom
## 450944      14725 United Kingdom
## 450945      14725 United Kingdom
## 450946      14725 United Kingdom
## 451108      14711 United Kingdom
## 451109      14711 United Kingdom
## 451133      14711 United Kingdom
## 451137      14711 United Kingdom
## 451138      14711 United Kingdom
## 451527      13614 United Kingdom
## 451555      13614 United Kingdom
## 451579      13614 United Kingdom
## 451841      18181 United Kingdom
## 451858      18181 United Kingdom
## 451876      18181 United Kingdom
## 451960      12474        Germany
## 451965      12474        Germany
## 452039      17357 United Kingdom
## 453409      12890 United Kingdom
## 453450      12890 United Kingdom
## 453459      12890 United Kingdom
## 454135      14534 United Kingdom
## 454166      17377 United Kingdom
## 454298      17841 United Kingdom
## 454313      17841 United Kingdom
## 454453      16916 United Kingdom
## 454462      16916 United Kingdom
## 454468      16916 United Kingdom
## 454516      16916 United Kingdom
## 454523      16916 United Kingdom
## 454532      16916 United Kingdom
## 454652      16717 United Kingdom
## 454706      16657 United Kingdom
## 454708      16657 United Kingdom
## 454716      16657 United Kingdom
## 454721      16657 United Kingdom
## 454748      15900 United Kingdom
## 454769      15900 United Kingdom
## 454770      15900 United Kingdom
## 454772      15900 United Kingdom
## 454838      16469 United Kingdom
## 454852      16469 United Kingdom
## 454859      16469 United Kingdom
## 454861      16469 United Kingdom
## 454869      16469 United Kingdom
## 454893      16669 United Kingdom
## 454902      16669 United Kingdom
## 454922      16669 United Kingdom
## 454962      14527 United Kingdom
## 455197      14554 United Kingdom
## 455222      14554 United Kingdom
## 455227      14554 United Kingdom
## 455230      14554 United Kingdom
## 455242      14554 United Kingdom
## 455261      14554 United Kingdom
## 455263      14554 United Kingdom
## 455267      14554 United Kingdom
## 455278      14554 United Kingdom
## 455347      16204 United Kingdom
## 455355      16204 United Kingdom
## 455361      16204 United Kingdom
## 455367      16204 United Kingdom
## 455370      16204 United Kingdom
## 455371      16204 United Kingdom
## 455382      16204 United Kingdom
## 455521      14898 United Kingdom
## 455522      14898 United Kingdom
## 455533      14898 United Kingdom
## 455536      14898 United Kingdom
## 456761      17368 United Kingdom
## 456764      17368 United Kingdom
## 456929      15967 United Kingdom
## 456942      15967 United Kingdom
## 457058      12748 United Kingdom
## 457077      12748 United Kingdom
## 457088      12748 United Kingdom
## 457092      12748 United Kingdom
## 457093      12748 United Kingdom
## 457094      12748 United Kingdom
## 457095      12748 United Kingdom
## 457100      12748 United Kingdom
## 457102      12748 United Kingdom
## 457295      12748 United Kingdom
## 457311      12748 United Kingdom
## 457411      15805 United Kingdom
## 457531      12748 United Kingdom
## 457781      17461 United Kingdom
## 457822      17461 United Kingdom
## 457825      17461 United Kingdom
## 457829      17461 United Kingdom
## 457830      17461 United Kingdom
## 458064      14102 United Kingdom
## 458065      14102 United Kingdom
## 458168      15529 United Kingdom
## 458201      15529 United Kingdom
## 458214      15529 United Kingdom
## 458231      15529 United Kingdom
## 458594      14704 United Kingdom
## 458596      14704 United Kingdom
## 458613      14704 United Kingdom
## 458616      14704 United Kingdom
## 458830      12847 United Kingdom
## 458836      12847 United Kingdom
## 458842      12847 United Kingdom
## 458844      12847 United Kingdom
## 458863      12847 United Kingdom
## 458869      12847 United Kingdom
## 458877      12847 United Kingdom
## 459194      14034 United Kingdom
## 459198      14034 United Kingdom
## 459225      14034 United Kingdom
## 459267      17397 United Kingdom
## 459268      17397 United Kingdom
## 459273      17397 United Kingdom
## 459332      17985 United Kingdom
## 459334      17985 United Kingdom
## 459410      12748 United Kingdom
## 459413      12748 United Kingdom
## 459421      12748 United Kingdom
## 459434      12748 United Kingdom
## 459436      12748 United Kingdom
## 459440      12748 United Kingdom
## 459443      12748 United Kingdom
## 459465      12748 United Kingdom
## 459466      12748 United Kingdom
## 459470      12748 United Kingdom
## 459472      12748 United Kingdom
## 459482      12748 United Kingdom
## 459483      12748 United Kingdom
## 459484      12748 United Kingdom
## 459496      12748 United Kingdom
## 459534      18122 United Kingdom
## 459545      18122 United Kingdom
## 459554      18122 United Kingdom
## 459568      18122 United Kingdom
## 459571      18122 United Kingdom
## 459591      18122 United Kingdom
## 459742      14362 United Kingdom
## 459754      14362 United Kingdom
## 459755      14362 United Kingdom
## 459757      14362 United Kingdom
## 460728      14456 United Kingdom
## 460735      14456 United Kingdom
## 461009      14508 United Kingdom
## 461010      14508 United Kingdom
## 461419      16511 United Kingdom
## 461439      16511 United Kingdom
## 461446      16511 United Kingdom
## 461453      16511 United Kingdom
## 461623      17841 United Kingdom
## 461757      17324 United Kingdom
## 461891      18034 United Kingdom
## 461892      18034 United Kingdom
## 462041      17286 United Kingdom
## 462149      14593 United Kingdom
## 462205      16924 United Kingdom
## 462210      16924 United Kingdom
## 462251      17904 United Kingdom
## 462252      17904 United Kingdom
## 462255      17904 United Kingdom
## 462259      17904 United Kingdom
## 462371      18225 United Kingdom
## 462372      18225 United Kingdom
## 462545      16426 United Kingdom
## 462554      16426 United Kingdom
## 462555      16426 United Kingdom
## 462559      16426 United Kingdom
## 462560      16426 United Kingdom
## 462577      16426 United Kingdom
## 462581      16426 United Kingdom
## 462626      17301 United Kingdom
## 462636      17301 United Kingdom
## 462638      17301 United Kingdom
## 462639      17301 United Kingdom
## 462647      17301 United Kingdom
## 462660      17301 United Kingdom
## 462663      17301 United Kingdom
## 462790      14667 United Kingdom
## 462887      15494 United Kingdom
## 462894      15494 United Kingdom
## 463562      14903 United Kingdom
## 463963      18118 United Kingdom
## 464029      15009 United Kingdom
## 464095      15919 United Kingdom
## 464096      15919 United Kingdom
## 464103      15919 United Kingdom
## 464119      15919 United Kingdom
## 464120      15919 United Kingdom
## 464139      15919 United Kingdom
## 464140      15919 United Kingdom
## 464156      15919 United Kingdom
## 464159      15919 United Kingdom
## 464167      15919 United Kingdom
## 464168      15919 United Kingdom
## 464266      14525 United Kingdom
## 464288      14525 United Kingdom
## 464345      16762 United Kingdom
## 464346      16762 United Kingdom
## 464347      16762 United Kingdom
## 464348      16762 United Kingdom
## 464349      16762 United Kingdom
## 464350      16762 United Kingdom
## 464351      16762 United Kingdom
## 464352      16762 United Kingdom
## 464353      16762 United Kingdom
## 464354      16762 United Kingdom
## 464355      16762 United Kingdom
## 464356      16762 United Kingdom
## 464357      16762 United Kingdom
## 464358      16762 United Kingdom
## 464359      16762 United Kingdom
## 464360      16762 United Kingdom
## 464364      16762 United Kingdom
## 464365      16762 United Kingdom
## 464366      16762 United Kingdom
## 464367      16762 United Kingdom
## 464368      16762 United Kingdom
## 464369      16762 United Kingdom
## 464370      16762 United Kingdom
## 464371      16762 United Kingdom
## 464372      16762 United Kingdom
## 464373      16762 United Kingdom
## 464402      14502 United Kingdom
## 464507      16360 United Kingdom
## 464530      16360 United Kingdom
## 464533      16360 United Kingdom
## 464604      16360 United Kingdom
## 464662         NA United Kingdom
## 464683      16464 United Kingdom
## 464764      17323 United Kingdom
## 464768      17323 United Kingdom
## 464769      17323 United Kingdom
## 464826      14704 United Kingdom
## 464830      14704 United Kingdom
## 464835      14704 United Kingdom
## 464874      17555 United Kingdom
## 465047      18110 United Kingdom
## 465054      18110 United Kingdom
## 465058      18110 United Kingdom
## 465063      18110 United Kingdom
## 465064      18110 United Kingdom
## 465066      18110 United Kingdom
## 465081      18110 United Kingdom
## 465082      18110 United Kingdom
## 465084      18110 United Kingdom
## 465099      14159 United Kingdom
## 465113      14159 United Kingdom
## 465134      14159 United Kingdom
## 465153      14159 United Kingdom
## 465215      14159 United Kingdom
## 465251      14159 United Kingdom
## 465261      14159 United Kingdom
## 465272      14159 United Kingdom
## 465333      13212 United Kingdom
## 465420      14710 United Kingdom
## 465422      14710 United Kingdom
## 465447      14710 United Kingdom
## 465487      18127 United Kingdom
## 465513      17561 United Kingdom
## 465624      16710 United Kingdom
## 465705      15044 United Kingdom
## 465804      15988 United Kingdom
## 466340      15850 United Kingdom
## 466408      14984 United Kingdom
## 466606      16931 United Kingdom
## 466619      17841 United Kingdom
## 466641      17841 United Kingdom
## 466644      17841 United Kingdom
## 466679      17841 United Kingdom
## 466808      15426 United Kingdom
## 466814      15426 United Kingdom
## 466828      15426 United Kingdom
## 466835      15426 United Kingdom
## 466966      16399 United Kingdom
## 467418      12856 United Kingdom
## 467551      16406 United Kingdom
## 467586      16406 United Kingdom
## 467587      16406 United Kingdom
## 467593      16406 United Kingdom
## 467693      14449 United Kingdom
## 467757      15527 United Kingdom
## 467877      16713 United Kingdom
## 467878      16713 United Kingdom
## 467940      17811 United Kingdom
## 467941      17811 United Kingdom
## 467951      17811 United Kingdom
## 467954      17811 United Kingdom
## 467958      17811 United Kingdom
## 467959      17811 United Kingdom
## 468098      17625 United Kingdom
## 468128      17625 United Kingdom
## 468131      17625 United Kingdom
## 468133      17625 United Kingdom
## 468139      17625 United Kingdom
## 468142      17625 United Kingdom
## 468189      13755 United Kingdom
## 468235      13755 United Kingdom
## 468443      12904 United Kingdom
## 469149      16712 United Kingdom
## 469152      16712 United Kingdom
## 469162      16712 United Kingdom
## 469166      16712 United Kingdom
## 469169      16712 United Kingdom
## 469259      16712 United Kingdom
## 469318      16549 United Kingdom
## 469320      16549 United Kingdom
## 469322      16549 United Kingdom
## 469323      16549 United Kingdom
## 469326      16549 United Kingdom
## 469329      16549 United Kingdom
## 469336      16549 United Kingdom
## 469354      16549 United Kingdom
## 469388      16549 United Kingdom
## 469394      16549 United Kingdom
## 469401      16549 United Kingdom
## 469411      16549 United Kingdom
## 469412      16549 United Kingdom
## 469417      16549 United Kingdom
## 469420      16549 United Kingdom
## 469660      14030 United Kingdom
## 469688      13246 United Kingdom
## 469689      13246 United Kingdom
## 470291      15877 United Kingdom
## 470300      15877 United Kingdom
## 470356      15877 United Kingdom
## 470484      13268 United Kingdom
## 470571      15525 United Kingdom
## 470576      15525 United Kingdom
## 470579      15525 United Kingdom
## 470581      15525 United Kingdom
## 470881      14506 United Kingdom
## 470884      14506 United Kingdom
## 470886      14506 United Kingdom
## 470893      14506 United Kingdom
## 470959      13569 United Kingdom
## 470969      13569 United Kingdom
## 470979      13569 United Kingdom
## 470984      13569 United Kingdom
## 470988      13569 United Kingdom
## 471047      17360 United Kingdom
## 471048      17360 United Kingdom
## 471049      17360 United Kingdom
## 471054      17360 United Kingdom
## 471578      17338 United Kingdom
## 471629      17338 United Kingdom
## 471641      17338 United Kingdom
## 471648      17338 United Kingdom
## 471651      17338 United Kingdom
## 471659      17338 United Kingdom
## 471663      17338 United Kingdom
## 471665      17338 United Kingdom
## 471667      17338 United Kingdom
## 471675      17338 United Kingdom
## 471691      17338 United Kingdom
## 471707      17338 United Kingdom
## 471710      17338 United Kingdom
## 471711      17338 United Kingdom
## 471712      17338 United Kingdom
## 471721      17338 United Kingdom
## 471723      17338 United Kingdom
## 471729      17338 United Kingdom
## 471736      17338 United Kingdom
## 471739      17338 United Kingdom
## 471740      17338 United Kingdom
## 471821      17297 United Kingdom
## 471823      17297 United Kingdom
## 471908      12920 United Kingdom
## 472976      14505 United Kingdom
## 473040      14505 United Kingdom
## 473050      14505 United Kingdom
## 473055      14505 United Kingdom
## 473118      17759 United Kingdom
## 473119      17759 United Kingdom
## 473127      17759 United Kingdom
## 473140      17759 United Kingdom
## 473167      17759 United Kingdom
## 473215      17590 United Kingdom
## 473219      17590 United Kingdom
## 473245      17590 United Kingdom
## 473269      17590 United Kingdom
## 473282      17590 United Kingdom
## 473496      16376 United Kingdom
## 473508      16376 United Kingdom
## 473545      16376 United Kingdom
## 474060      13742 United Kingdom
## 474079      13742 United Kingdom
## 474104      12748 United Kingdom
## 474115      12748 United Kingdom
## 474456      12748 United Kingdom
## 474466      12748 United Kingdom
## 474470      12748 United Kingdom
## 474492      12748 United Kingdom
## 474500      12748 United Kingdom
## 474506      12748 United Kingdom
## 474515      12748 United Kingdom
## 474532      12748 United Kingdom
## 474628      12748 United Kingdom
## 474637      12748 United Kingdom
## 474848      14049 United Kingdom
## 474855      14049 United Kingdom
## 474865      14049 United Kingdom
## 474900      14049 United Kingdom
## 474903      14049 United Kingdom
## 474954      14049 United Kingdom
## 474959      14049 United Kingdom
## 475154      15901 United Kingdom
## 475158      15901 United Kingdom
## 475161      15901 United Kingdom
## 475165      15901 United Kingdom
## 475220      15993 United Kingdom
## 475282      14675 United Kingdom
## 475305      14675 United Kingdom
## 475312      14675 United Kingdom
## 475324      14675 United Kingdom
## 475344      14675 United Kingdom
## 475474      18283 United Kingdom
## 475512      18283 United Kingdom
## 475518      18283 United Kingdom
## 475519      18283 United Kingdom
## 475541      18283 United Kingdom
## 476140      14335        Germany
## 476170      15916 United Kingdom
## 476231      12748 United Kingdom
## 476341      17841 United Kingdom
## 476344      17841 United Kingdom
## 476360      17841 United Kingdom
## 476361      17841 United Kingdom
## 476362      17841 United Kingdom
## 476364      17841 United Kingdom
## 476365      17841 United Kingdom
## 476366      17841 United Kingdom
## 476367      17841 United Kingdom
## 476368      17841 United Kingdom
## 476370      17841 United Kingdom
## 476371      17841 United Kingdom
## 476372      17841 United Kingdom
## 476373      17841 United Kingdom
## 476374      17841 United Kingdom
## 476375      17841 United Kingdom
## 476387      17841 United Kingdom
## 476443      17841 United Kingdom
## 476909      17290 United Kingdom
## 476910      17290 United Kingdom
## 477141      17530 United Kingdom
## 477162      16343 United Kingdom
## 477171      16343 United Kingdom
## 477185      16343 United Kingdom
## 477187      16343 United Kingdom
## 478854      16326 United Kingdom
## 478948      15005 United Kingdom
## 479132      15858 United Kingdom
## 479143      15858 United Kingdom
## 479220      12784       Portugal
## 479221      12784       Portugal
## 479341      16892 United Kingdom
## 479416      14056 United Kingdom
## 479546      16885 United Kingdom
## 479578      14591 United Kingdom
## 479580      14591 United Kingdom
## 479660      14591 United Kingdom
## 479663      14591 United Kingdom
## 479664      14591 United Kingdom
## 479667      14591 United Kingdom
## 479672      14591 United Kingdom
## 479689      14591 United Kingdom
## 479709      14591 United Kingdom
## 479712      14591 United Kingdom
## 479720      14591 United Kingdom
## 479722      14591 United Kingdom
## 479724      14591 United Kingdom
## 479786      17812 United Kingdom
## 479793      17812 United Kingdom
## 479834      17254 United Kingdom
## 479925      17364 United Kingdom
## 479927      17364 United Kingdom
## 480151      14277         France
## 480152      14277         France
## 480247      17345 United Kingdom
## 480251      17345 United Kingdom
## 480268      17345 United Kingdom
## 480374      17247 United Kingdom
## 480582      15910 United Kingdom
## 480755      16016 United Kingdom
## 480759      16016 United Kingdom
## 480763      16016 United Kingdom
## 480766      16016 United Kingdom
## 480850      17841 United Kingdom
## 480865      17841 United Kingdom
## 480885      17841 United Kingdom
## 480893      17841 United Kingdom
## 481026      16719 United Kingdom
## 481049      16719 United Kingdom
## 481295      17385 United Kingdom
## 481296      17385 United Kingdom
## 481356      17870 United Kingdom
## 481363      17870 United Kingdom
## 481384      17870 United Kingdom
## 481571      12748 United Kingdom
## 481586      12748 United Kingdom
## 481609      12748 United Kingdom
## 481610      12748 United Kingdom
## 481613      12748 United Kingdom
## 481616      12748 United Kingdom
## 481628      12748 United Kingdom
## 481629      12748 United Kingdom
## 481632      12748 United Kingdom
## 481634      12748 United Kingdom
## 481700      15872 United Kingdom
## 481715      15872 United Kingdom
## 481724      15872 United Kingdom
## 481725      15872 United Kingdom
## 481726      15872 United Kingdom
## 481727      15872 United Kingdom
## 481729      15872 United Kingdom
## 481733      15872 United Kingdom
## 481735      15872 United Kingdom
## 481749      15872 United Kingdom
## 481750      15872 United Kingdom
## 481751      15872 United Kingdom
## 481755      15872 United Kingdom
## 481756      15872 United Kingdom
## 481757      15872 United Kingdom
## 481758      15872 United Kingdom
## 481760      15872 United Kingdom
## 481762      15872 United Kingdom
## 481768      15872 United Kingdom
## 481775      15872 United Kingdom
## 481878      14966 United Kingdom
## 481885      14966 United Kingdom
## 482027      16327 United Kingdom
## 482034      16327 United Kingdom
## 482203      12748 United Kingdom
## 482219      12748 United Kingdom
## 482225      12748 United Kingdom
## 482228      12748 United Kingdom
## 482229      12748 United Kingdom
## 482231      12748 United Kingdom
## 482244      12748 United Kingdom
## 482267      12748 United Kingdom
## 482309      16764 United Kingdom
## 482349      16764 United Kingdom
## 482444      17883 United Kingdom
## 484097      17841 United Kingdom
## 484102      17841 United Kingdom
## 484139      17841 United Kingdom
## 484153      17841 United Kingdom
## 484154      17841 United Kingdom
## 484342      17812 United Kingdom
## 484354      17812 United Kingdom
## 484436      13596 United Kingdom
## 484440      13596 United Kingdom
## 484442      13596 United Kingdom
## 484449      13596 United Kingdom
## 484452      13596 United Kingdom
## 484454      13596 United Kingdom
## 484455      13596 United Kingdom
## 484456      13596 United Kingdom
## 484485      13596 United Kingdom
## 484501      13596 United Kingdom
## 484503      13596 United Kingdom
## 484517      13596 United Kingdom
## 484528      13596 United Kingdom
## 484532      13596 United Kingdom
## 484535      13596 United Kingdom
## 484536      13596 United Kingdom
## 484538      13596 United Kingdom
## 484539      13596 United Kingdom
## 484541      13596 United Kingdom
## 484542      13596 United Kingdom
## 484611      16983 United Kingdom
## 484678      18156 United Kingdom
## 484682      18156 United Kingdom
## 484687      18156 United Kingdom
## 484693      18156 United Kingdom
## 484699      18156 United Kingdom
## 484701      18156 United Kingdom
## 484702      18156 United Kingdom
## 484704      18156 United Kingdom
## 484709      18156 United Kingdom
## 484712      18156 United Kingdom
## 484713      18156 United Kingdom
## 484717      18156 United Kingdom
## 484728      18156 United Kingdom
## 484774      15747 United Kingdom
## 484803      15443 United Kingdom
## 484861      15443 United Kingdom
## 484882      13064 United Kingdom
## 484941      16923 United Kingdom
## 484994      15351 United Kingdom
## 485000      15351 United Kingdom
## 485028      15351 United Kingdom
## 485041      15351 United Kingdom
## 485094      16923 United Kingdom
## 485229      16024 United Kingdom
## 485369      17288 United Kingdom
## 485381      17288 United Kingdom
## 485462      16005 United Kingdom
## 485464      16005 United Kingdom
## 485487      16005 United Kingdom
## 485491      16005 United Kingdom
## 485492      16005 United Kingdom
## 485520      16005 United Kingdom
## 485562      16005 United Kingdom
## 485584      14547 United Kingdom
## 485633      14954 United Kingdom
## 485634      14954 United Kingdom
## 485657      14954 United Kingdom
## 485661      14954 United Kingdom
## 485675      14954 United Kingdom
## 485677      14954 United Kingdom
## 485704      14954 United Kingdom
## 485706      14954 United Kingdom
## 485714      17885 United Kingdom
## 485716      17885 United Kingdom
## 485725      17885 United Kingdom
## 485729      17885 United Kingdom
## 485746      17885 United Kingdom
## 485748      17885 United Kingdom
## 485758      17885 United Kingdom
## 485759      17885 United Kingdom
## 485760      17885 United Kingdom
## 485768      17885 United Kingdom
## 485770      17885 United Kingdom
## 485778      15514 United Kingdom
## 485779      15514 United Kingdom
## 485884      17231 United Kingdom
## 485917      17231 United Kingdom
## 485960      13610 United Kingdom
## 485992      15987 United Kingdom
## 486001      15987 United Kingdom
## 486005      15987 United Kingdom
## 486054      15861 United Kingdom
## 486169      15436 United Kingdom
## 486177      15436 United Kingdom
## 486183      15436 United Kingdom
## 486189      15436 United Kingdom
## 486194      15436 United Kingdom
## 486195      15436 United Kingdom
## 486201      15436 United Kingdom
## 486202      15436 United Kingdom
## 486203      15436 United Kingdom
## 486205      15436 United Kingdom
## 486210      15436 United Kingdom
## 486211      15436 United Kingdom
## 486213      15436 United Kingdom
## 486215      15436 United Kingdom
## 486216      15436 United Kingdom
## 486222      15436 United Kingdom
## 486223      15436 United Kingdom
## 486234      15436 United Kingdom
## 486238      15436 United Kingdom
## 486413      14093 United Kingdom
## 486419      14093 United Kingdom
## 486435      14093 United Kingdom
## 486457      14093 United Kingdom
## 486473      14093 United Kingdom
## 486946      15714 United Kingdom
## 487205      15721 United Kingdom
## 487206      15721 United Kingdom
## 487207      15721 United Kingdom
## 487209      15721 United Kingdom
## 487217      15721 United Kingdom
## 487222      15721 United Kingdom
## 487228      15721 United Kingdom
## 487335      15022 United Kingdom
## 487356      15022 United Kingdom
## 487357      15022 United Kingdom
## 487359      15022 United Kingdom
## 487361      15022 United Kingdom
## 487432      18096 United Kingdom
## 487433      18096 United Kingdom
## 487450      18096 United Kingdom
## 487453      18096 United Kingdom
## 487513      17019 United Kingdom
## 487515      17019 United Kingdom
## 487517      17019 United Kingdom
## 487518      17019 United Kingdom
## 487519      17019 United Kingdom
## 487549      17019 United Kingdom
## 487649      14597 United Kingdom
## 487656      14597 United Kingdom
## 487660      14597 United Kingdom
## 487661      14597 United Kingdom
## 487662      14597 United Kingdom
## 487663      14597 United Kingdom
## 487664      14597 United Kingdom
## 487665      14597 United Kingdom
## 487688      16347 United Kingdom
## 487689      16347 United Kingdom
## 487691      16347 United Kingdom
## 487694      16347 United Kingdom
## 487696      16347 United Kingdom
## 487718      16347 United Kingdom
## 487894      18101 United Kingdom
## 487982      17379 United Kingdom
## 487990      17379 United Kingdom
## 488008      17379 United Kingdom
## 488025      17379 United Kingdom
## 488044      17379 United Kingdom
## 488132      16800 United Kingdom
## 488137      16800 United Kingdom
## 488169      16800 United Kingdom
## 488186      16800 United Kingdom
## 488209      16800 United Kingdom
## 488213      16800 United Kingdom
## 488221      16800 United Kingdom
## 488222      16800 United Kingdom
## 488382      13030 United Kingdom
## 488384      13030 United Kingdom
## 488389      13030 United Kingdom
## 488390      13030 United Kingdom
## 490046      17772 United Kingdom
## 490062      17772 United Kingdom
## 490064      17772 United Kingdom
## 490181      14419 United Kingdom
## 490188      14419 United Kingdom
## 490189      14419 United Kingdom
## 490676      14452 United Kingdom
## 490680      14452 United Kingdom
## 490860      14550 United Kingdom
## 490995      14701 United Kingdom
## 490998      14701 United Kingdom
## 491000      14701 United Kingdom
## 491001      14701 United Kingdom
## 491078      13668 United Kingdom
## 491087      13668 United Kingdom
## 491088      13668 United Kingdom
## 491110      14719 United Kingdom
## 491218      12748 United Kingdom
## 491221      12748 United Kingdom
## 491225      12748 United Kingdom
## 491228      12748 United Kingdom
## 491422      14390 United Kingdom
## 491547      13428 United Kingdom
## 491550      13428 United Kingdom
## 491556      13428 United Kingdom
## 491590      16549 United Kingdom
## 491612      16549 United Kingdom
## 491621      16549 United Kingdom
## 491625      16549 United Kingdom
## 491628      16549 United Kingdom
## 491629      16549 United Kingdom
## 491632      16549 United Kingdom
## 491635      16549 United Kingdom
## 491636      16549 United Kingdom
## 491637      16549 United Kingdom
## 491648      16549 United Kingdom
## 491649      16549 United Kingdom
## 491651      16549 United Kingdom
## 491656      16549 United Kingdom
## 491658      16549 United Kingdom
## 491662      16549 United Kingdom
## 491665      16549 United Kingdom
## 491667      16549 United Kingdom
## 491672      16549 United Kingdom
## 491673      16549 United Kingdom
## 491678      16549 United Kingdom
## 491679      16549 United Kingdom
## 491681      16549 United Kingdom
## 491682      16549 United Kingdom
## 491685      16549 United Kingdom
## 491686      16549 United Kingdom
## 491689      16549 United Kingdom
## 491691      16549 United Kingdom
## 491760      15790 United Kingdom
## 491832      14711 United Kingdom
## 491997      16549 United Kingdom
## 492275      13521 United Kingdom
## 492276      13521 United Kingdom
## 492288      13521 United Kingdom
## 492298      13521 United Kingdom
## 492315      13521 United Kingdom
## 492316      13521 United Kingdom
## 492318      13521 United Kingdom
## 492323      13521 United Kingdom
## 492370      14723 United Kingdom
## 492376      14723 United Kingdom
## 492380      14723 United Kingdom
## 492409      14723 United Kingdom
## 492420      14723 United Kingdom
## 493856      17841 United Kingdom
## 493878      17841 United Kingdom
## 493896      17841 United Kingdom
## 493901      17841 United Kingdom
## 493982      12748 United Kingdom
## 493995      12748 United Kingdom
## 494283      14653 United Kingdom
## 494479      16241 United Kingdom
## 494528      16241 United Kingdom
## 494563      17835 United Kingdom
## 494564      17835 United Kingdom
## 494821      13647 United Kingdom
## 494853      15024 United Kingdom
## 494902      14963 United Kingdom
## 495076      18283 United Kingdom
## 495080      18283 United Kingdom
## 495250      15060 United Kingdom
## 495253      15060 United Kingdom
## 495568      15060 United Kingdom
## 495577      15060 United Kingdom
## 495578      15060 United Kingdom
## 495601      15060 United Kingdom
## 495721         NA United Kingdom
## 497850      14178 United Kingdom
## 498031      12748 United Kingdom
## 498033      12748 United Kingdom
## 498180      18122 United Kingdom
## 498206      18122 United Kingdom
## 498270      17768 United Kingdom
## 498463      17014 United Kingdom
## 499677      17576 United Kingdom
## 499687      17576 United Kingdom
## 499780      15531 United Kingdom
## 499835      17841 United Kingdom
## 499883      17841 United Kingdom
## 499897      17841 United Kingdom
## 499902      17841 United Kingdom
## 499976      17566 United Kingdom
## 499998      17566 United Kingdom
## 500002      17566 United Kingdom
## 500005      17566 United Kingdom
## 500007      17566 United Kingdom
## 500008      17566 United Kingdom
## 500519      18097 United Kingdom
## 500666      16899 United Kingdom
## 500730      14688 United Kingdom
## 500901      15547 United Kingdom
## 500957      16426 United Kingdom
## 500992      16426 United Kingdom
## 501041      13560 United Kingdom
## 501149      15311 United Kingdom
## 501184      14594 United Kingdom
## 501212      15856 United Kingdom
## 501221      15856 United Kingdom
## 501247      17221 United Kingdom
## 501322      16426 United Kingdom
## 501326      16426 United Kingdom
## 501328      16426 United Kingdom
## 501565      12970 United Kingdom
## 501566      12970 United Kingdom
## 501593      12970 United Kingdom
## 501601      12970 United Kingdom
## 501610      12970 United Kingdom
## 501611      12970 United Kingdom
## 501628      12970 United Kingdom
## 501637      12970 United Kingdom
## 501646      12970 United Kingdom
## 501648      12970 United Kingdom
## 501653      12970 United Kingdom
## 501657      12970 United Kingdom
## 501659      12970 United Kingdom
## 501660      12970 United Kingdom
## 501661      12970 United Kingdom
## 501662      12970 United Kingdom
## 501664      12970 United Kingdom
## 501665      12970 United Kingdom
## 501672      12970 United Kingdom
## 501673      12970 United Kingdom
## 501674      12970 United Kingdom
## 501709      12970 United Kingdom
## 501980      17238 United Kingdom
## 501981      17238 United Kingdom
## 501985      17238 United Kingdom
## 502697         NA United Kingdom
## 502885      16326 United Kingdom
## 502886      16326 United Kingdom
## 502893      16326 United Kingdom
## 502894      16326 United Kingdom
## 503005      13838 United Kingdom
## 503010      13838 United Kingdom
## 503011      13838 United Kingdom
## 503023      13838 United Kingdom
## 503123      13471 United Kingdom
## 503143      13471 United Kingdom
## 503154      13471 United Kingdom
## 503161      13471 United Kingdom
## 503197      13471 United Kingdom
## 503209      13471 United Kingdom
## 503250      13536 United Kingdom
## 503406      17114 United Kingdom
## 503412      17114 United Kingdom
## 503415      17114 United Kingdom
## 503469      12748 United Kingdom
## 503474      12748 United Kingdom
## 503478      12748 United Kingdom
## 503496      14583 United Kingdom
## 503497      14583 United Kingdom
## 503498      14583 United Kingdom
## 503499      14583 United Kingdom
## 503528      14583 United Kingdom
## 503545      14583 United Kingdom
## 503556      14583 United Kingdom
## 503557      14583 United Kingdom
## 503563      14583 United Kingdom
## 503564      14583 United Kingdom
## 503578      14583 United Kingdom
## 503739      14546 United Kingdom
## 503754      14546 United Kingdom
## 503901      13956 United Kingdom
## 503935      17936 United Kingdom
## 503941      17936 United Kingdom
## 503949      17936 United Kingdom
## 503958      17936 United Kingdom
## 503979      17936 United Kingdom
## 504261      17750 United Kingdom
## 504290      17954 United Kingdom
## 504292      17954 United Kingdom
## 504293      17954 United Kingdom
## 504326      17954 United Kingdom
## 504446      13521 United Kingdom
## 504490      13521 United Kingdom
## 504505      13521 United Kingdom
## 504520      13521 United Kingdom
## 504530      13521 United Kingdom
## 504541      13521 United Kingdom
## 504548      13521 United Kingdom
## 504559      17827 United Kingdom
## 504564      17827 United Kingdom
## 504610      17827 United Kingdom
## 504711      13736 United Kingdom
## 505561      12748 United Kingdom
## 505562      12748 United Kingdom
## 505565      12748 United Kingdom
## 505575      12748 United Kingdom
## 505593      12748 United Kingdom
## 505606      12748 United Kingdom
## 505627      12748 United Kingdom
## 506028      15053 United Kingdom
## 506045      15053 United Kingdom
## 506084      16360 United Kingdom
## 506127      16360 United Kingdom
## 506315      14649 United Kingdom
## 506322      14649 United Kingdom
## 506323      14649 United Kingdom
## 506340      14649 United Kingdom
## 506345      14649 United Kingdom
## 506346      14649 United Kingdom
## 506524      16910 United Kingdom
## 506525      16910 United Kingdom
## 506832      15854 United Kingdom
## 506844      15854 United Kingdom
## 506902      17811 United Kingdom
## 507062      15031 United Kingdom
## 507368      16200 United Kingdom
## 507381      16200 United Kingdom
## 507399      16200 United Kingdom
## 507402      16200 United Kingdom
## 507416      16200 United Kingdom
## 507427      16200 United Kingdom
## 507467      16200 United Kingdom
## 507779      13230 United Kingdom
## 507792      13230 United Kingdom
## 507811      13230 United Kingdom
## 507817      13230 United Kingdom
## 507885      15984 United Kingdom
## 507902      15984 United Kingdom
## 508027      14629 United Kingdom
## 510097      17383 United Kingdom
## 510117      17383 United Kingdom
## 510760      17884 United Kingdom
## 510763      17884 United Kingdom
## 510905      18005 United Kingdom
## 510910      18005 United Kingdom
## 510912      18005 United Kingdom
## 510916      18005 United Kingdom
## 510917      18005 United Kingdom
## 510950      17914 United Kingdom
## 510977      17914 United Kingdom
## 510991      17914 United Kingdom
## 511000      17914 United Kingdom
## 511008      17914 United Kingdom
## 511226      17250 United Kingdom
## 511424      15907 United Kingdom
## 511430      15907 United Kingdom
## 511448      15907 United Kingdom
## 511449      15907 United Kingdom
## 511453      15907 United Kingdom
## 511458      15907 United Kingdom
## 511460      15907 United Kingdom
## 511463      15907 United Kingdom
## 511464      15907 United Kingdom
## 511549      17290 United Kingdom
## 511558      17290 United Kingdom
## 511568      17290 United Kingdom
## 511570      17290 United Kingdom
## 511616      14606 United Kingdom
## 511627      14606 United Kingdom
## 511651      14606 United Kingdom
## 511753      16495 United Kingdom
## 511761      16495 United Kingdom
## 511765      16495 United Kingdom
## 511781      16495 United Kingdom
## 511787      16495 United Kingdom
## 511789      16495 United Kingdom
## 511791      16495 United Kingdom
## 511792      16495 United Kingdom
## 511794      16495 United Kingdom
## 511863      14871 United Kingdom
## 512159      17266 United Kingdom
## 512172      17266 United Kingdom
## 512178      17266 United Kingdom
## 512180      17266 United Kingdom
## 512181      17266 United Kingdom
## 512195      17266 United Kingdom
## 512196      17266 United Kingdom
## 512482      17861 United Kingdom
## 512485      17861 United Kingdom
## 513347      16987 United Kingdom
## 513389      17883 United Kingdom
## 513392      17883 United Kingdom
## 514149      17232 United Kingdom
## 514278      14087 United Kingdom
## 514467      16368 United Kingdom
## 514478      16368 United Kingdom
## 514480      16368 United Kingdom
## 514493      16368 United Kingdom
## 514501      16368 United Kingdom
## 514502      16368 United Kingdom
## 514503      16368 United Kingdom
## 514576      14204 United Kingdom
## 514588      14204 United Kingdom
## 514589      14204 United Kingdom
## 514590      14204 United Kingdom
## 514598      14204 United Kingdom
## 514766      16426 United Kingdom
## 514802      15471 United Kingdom
## 514817      15471 United Kingdom
## 514850      15471 United Kingdom
## 514855      15471 United Kingdom
## 515003      15525 United Kingdom
## 515011      15525 United Kingdom
## 515025      15525 United Kingdom
## 515028      15525 United Kingdom
## 515029      15525 United Kingdom
## 515031      15525 United Kingdom
## 515032      15525 United Kingdom
## 515042      15525 United Kingdom
## 515043      15525 United Kingdom
## 515133      17870 United Kingdom
## 515149      17870 United Kingdom
## 515163      17870 United Kingdom
## 515469      17449 United Kingdom
## 517281      15443 United Kingdom
## 517285      15443 United Kingdom
## 517287      15443 United Kingdom
## 517310      15443 United Kingdom
## 517620      16891 United Kingdom
## 517839      16442 United Kingdom
## 518006      17841 United Kingdom
## 518012      17841 United Kingdom
## 518023      17841 United Kingdom
## 518068      17315 United Kingdom
## 518088      14698 United Kingdom
## 518090      14698 United Kingdom
## 518095      14698 United Kingdom
## 518561      13680 United Kingdom
## 518643      13521 United Kingdom
## 518733      13521 United Kingdom
## 518761      13521 United Kingdom
## 518880      14415 United Kingdom
## 518931      14415 United Kingdom
## 519005      14730 United Kingdom
## 519010      14730 United Kingdom
## 519016      14730 United Kingdom
## 519025      14730 United Kingdom
## 519030      14730 United Kingdom
## 519035      14730 United Kingdom
## 519039      14730 United Kingdom
## 519196      14796 United Kingdom
## 519209      14796 United Kingdom
## 519224      14796 United Kingdom
## 520074      12748 United Kingdom
## 520108      16794 United Kingdom
## 520214      17530 United Kingdom
## 520361      14702 United Kingdom
## 521770      17754 United Kingdom
## 521814      14446 United Kingdom
## 521834      14446 United Kingdom
## 521848      14446 United Kingdom
## 521851      14446 United Kingdom
## 521858      14446 United Kingdom
## 521860      14446 United Kingdom
sum(duplicated(bdsuper1))
## [1] 5286

#@ Eliminar renglones duplicados

bdsuper2 <- bdsuper1
bdsuper2 <- distinct(bdsuper2)

Precios en absoluto

bdsuper3 <- bdsuper2
bdsuper3$Price <- abs(bdsuper3$Price)    
summary(bdsuper3)
##     BillNo            Itemname            Quantity            Date          
##  Length:516778      Length:516778      Min.   :-9600.00   Length:516778     
##  Class :character   Class :character   1st Qu.:    1.00   Class :character  
##  Mode  :character   Mode  :character   Median :    3.00   Mode  :character  
##                                        Mean   :   10.16                     
##                                        3rd Qu.:   10.00                     
##                                        Max.   :80995.00                     
##                                                                             
##      Price             CustomerID       Country         
##  Min.   :    0.000   Min.   :12346    Length:516778     
##  1st Qu.:    1.250   1st Qu.:13928    Class :character  
##  Median :    2.080   Median :15249    Mode  :character  
##  Mean   :    3.927   Mean   :15310                      
##  3rd Qu.:    4.130   3rd Qu.:16820                      
##  Max.   :13541.330   Max.   :18287                      
##                      NA's   :133967

Cantidades a enteros

bdsuper4 <- bdsuper3
bdsuper4$Quantity <- abs(bdsuper4$Quantity)
summary(bdsuper4)
##     BillNo            Itemname            Quantity            Date          
##  Length:516778      Length:516778      Min.   :    1.00   Length:516778     
##  Class :character   Class :character   1st Qu.:    1.00   Class :character  
##  Mode  :character   Mode  :character   Median :    3.00   Mode  :character  
##                                        Mean   :   10.96                     
##                                        3rd Qu.:   10.00                     
##                                        Max.   :80995.00                     
##                                                                             
##      Price             CustomerID       Country         
##  Min.   :    0.000   Min.   :12346    Length:516778     
##  1st Qu.:    1.250   1st Qu.:13928    Class :character  
##  Median :    2.080   Median :15249    Mode  :character  
##  Mean   :    3.927   Mean   :15310                      
##  3rd Qu.:    4.130   3rd Qu.:16820                      
##  Max.   :13541.330   Max.   :18287                      
##                      NA's   :133967

Encontrar valores NA

bdsuper5 <- bdsuper4
sum(is.na(bdsuper5))
## [1] 133967
sum(is.na(bdsuper))
## [1] 134041

¿Cuantos NA tengo por variable?

sapply(bdsuper5, function(x) sum(is.na(x)))
##     BillNo   Itemname   Quantity       Date      Price CustomerID    Country 
##          0          0          0          0          0     133967          0

Remplazar los NA con CEROS (0)

bdsuper6 <- bdsuper5
bdsuper6[is.na(bdsuper6)] <- 0
summary(bdsuper6)
##     BillNo            Itemname            Quantity            Date          
##  Length:516778      Length:516778      Min.   :    1.00   Length:516778     
##  Class :character   Class :character   1st Qu.:    1.00   Class :character  
##  Mode  :character   Mode  :character   Median :    3.00   Mode  :character  
##                                        Mean   :   10.96                     
##                                        3rd Qu.:   10.00                     
##                                        Max.   :80995.00                     
##      Price             CustomerID      Country         
##  Min.   :    0.000   Min.   :    0   Length:516778     
##  1st Qu.:    1.250   1st Qu.:    0   Class :character  
##  Median :    2.080   Median :14298   Mode  :character  
##  Mean   :    3.927   Mean   :11341                     
##  3rd Qu.:    4.130   3rd Qu.:16284                     
##  Max.   :13541.330   Max.   :18287

Agregar columna nueva de “Revenue”

bdsuper7 <- bdsuper6
bdsuper7$Revenue <- bdsuper7$Price * bdsuper7$Quantity
summary(bdsuper7)
##     BillNo            Itemname            Quantity            Date          
##  Length:516778      Length:516778      Min.   :    1.00   Length:516778     
##  Class :character   Class :character   1st Qu.:    1.00   Class :character  
##  Mode  :character   Mode  :character   Median :    3.00   Mode  :character  
##                                        Mean   :   10.96                     
##                                        3rd Qu.:   10.00                     
##                                        Max.   :80995.00                     
##      Price             CustomerID      Country             Revenue         
##  Min.   :    0.000   Min.   :    0   Length:516778      Min.   :     0.00  
##  1st Qu.:    1.250   1st Qu.:    0   Class :character   1st Qu.:     3.75  
##  Median :    2.080   Median :14298   Mode  :character   Median :     9.87  
##  Mean   :    3.927   Mean   :11341                      Mean   :    19.93  
##  3rd Qu.:    4.130   3rd Qu.:16284                      3rd Qu.:    17.40  
##  Max.   :13541.330   Max.   :18287                      Max.   :168469.60

Exportar base de datos limpia

bdsuper_limpia <- bdsuper7
write.csv(bdsuper_limpia, file = "supermercados_bdlimpia.csv", row.names = FALSE)

Market Basket Analysis de base de datos Supermercados

Importar librerias

library(plyr)
## ------------------------------------------------------------------------------
## You have loaded plyr after dplyr - this is likely to cause problems.
## If you need functions from both plyr and dplyr, please load plyr first, then dplyr:
## library(plyr); library(dplyr)
## ------------------------------------------------------------------------------
## 
## Attaching package: 'plyr'
## The following object is masked from 'package:purrr':
## 
##     compact
## The following objects are masked from 'package:dplyr':
## 
##     arrange, count, desc, failwith, id, mutate, rename, summarise,
##     summarize
library(Matrix)
## 
## Attaching package: 'Matrix'
## The following objects are masked from 'package:tidyr':
## 
##     expand, pack, unpack
library(arules)
## 
## Attaching package: 'arules'
## The following object is masked from 'package:dplyr':
## 
##     recode
## The following objects are masked from 'package:base':
## 
##     abbreviate, write
library(arulesViz)
library(datasets)

Importar base de datos limpia

bdsuper_limpia <- read.csv("/Users/marcelotam/Desktop/manipulacion de datos/supermercados_bdlimpia.csv")

Ordenas de menor a mayor los BillNo

bdsuper_limpia <- bdsuper_limpia[order(bdsuper_limpia$BillNo),]
head(bdsuper_limpia)
##   BillNo                            Itemname Quantity          Date Price
## 1 536365  WHITE HANGING HEART T-LIGHT HOLDER        6 01/12/10 8:26  2.55
## 2 536365                 WHITE METAL LANTERN        6 01/12/10 8:26  3.39
## 3 536365      CREAM CUPID HEARTS COAT HANGER        8 01/12/10 8:26  2.75
## 4 536365 KNITTED UNION FLAG HOT WATER BOTTLE        6 01/12/10 8:26  3.39
## 5 536365      RED WOOLLY HOTTIE WHITE HEART.        6 01/12/10 8:26  3.39
## 6 536365        SET 7 BABUSHKA NESTING BOXES        2 01/12/10 8:26  7.65
##   CustomerID        Country Revenue
## 1      17850 United Kingdom   15.30
## 2      17850 United Kingdom   20.34
## 3      17850 United Kingdom   22.00
## 4      17850 United Kingdom   20.34
## 5      17850 United Kingdom   20.34
## 6      17850 United Kingdom   15.30
tail(bdsuper_limpia)
##         BillNo                        Itemname Quantity           Date    Price
## 516776  581587    CHILDRENS CUTLERY DOLLY GIRL        4 09/12/11 12:50     4.15
## 516777  581587 CHILDRENS CUTLERY CIRCUS PARADE        4 09/12/11 12:50     4.15
## 516778  581587    BAKING SET 9 PIECE RETROSPOT        3 09/12/11 12:50     4.95
## 286404 A563185                 Adjust bad debt        1 12/08/11 14:50 11062.06
## 286405 A563186                 Adjust bad debt        1 12/08/11 14:51 11062.06
## 286406 A563187                 Adjust bad debt        1 12/08/11 14:52 11062.06
##        CustomerID        Country  Revenue
## 516776      12680         France    16.60
## 516777      12680         France    16.60
## 516778      12680         France    14.85
## 286404          0 United Kingdom 11062.06
## 286405          0 United Kingdom 11062.06
## 286406          0 United Kingdom 11062.06

Extraer productos por BillNo

basket <- ddply(bdsuper_limpia, c("BillNo"), function(bdsuper_limpia)paste(bdsuper_limpia$Itemname,collapse=","))

Eliminar numero de BillNo

basket$BillNo <- NULL

Renombrar el nombre de la columna marca

colnames(basket) <- ("Product")

Exportar basket

write.csv(basket, "basketsuper.csv", quote = FALSE, row.names = FALSE)

Importar transacciones

trs <- read.transactions("/Users/marcelotam/Desktop/manipulacion de datos/basketsuper.csv", format = "basket", sep = ",")
## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string

## Warning in scan(text = l, what = "character", sep = sep, quote = quote, : EOF
## within quoted string
## Warning in asMethod(object): removing duplicated items in transactions

Generar reglas de asociocion

reglas_asociacion <- apriori(trs, parameter = list(supp=0.001, conf=0.2, maxlen=10))
## Apriori
## 
## Parameter specification:
##  confidence minval smax arem  aval originalSupport maxtime support minlen
##         0.2    0.1    1 none FALSE            TRUE       5   0.001      1
##  maxlen target  ext
##      10  rules TRUE
## 
## Algorithmic control:
##  filter tree heap memopt load sort verbose
##     0.1 TRUE TRUE  FALSE TRUE    2    TRUE
## 
## Absolute minimum support count: 21 
## 
## set item appearances ...[0 item(s)] done [0.00s].
## set transactions ...[8767 item(s), 21664 transaction(s)] done [0.11s].
## sorting and recoding items ... [2601 item(s)] done [0.01s].
## creating transaction tree ... done [0.01s].
## checking subsets of size 1 2 3 4 5 6 7 8 9 10
## Warning in apriori(trs, parameter = list(supp = 0.001, conf = 0.2, maxlen
## = 10)): Mining stopped (maxlen reached). Only patterns up to a length of 10
## returned!
##  done [1.28s].
## writing ... [3136423 rule(s)] done [0.40s].
## creating S4 object  ... done [1.33s].
#summary(reglas_asociacion)
#inspect(reglas_asociacion)

reglas_asociacion <- sort(reglas_asociacion, by = "confidence", decreasing = TRUE)
#summary(reglas_asociacion)
#inspect(reglas_asociacion)

top10reglas <- head(reglas_asociacion, n=10, by = "confidence")
plot(top10reglas, method = "graph", engine = "htmlwidget")

Hallazgos

  • Cada vez que alguien se lleva un “Billboard Font Design” se llevan el “Wrap”.

  • Cada vez que se llevan un “Wobbly Chicken” se llevan un “Metal” y/o “Decoration”.

  • Cada vez que se llevan una “Silver mini tape measure” se llevan una “Lunch bag cars blue”, “Jumnbo bag pink vintage paisley”, “Strawberry Charlotte bag”.

LS0tCnRpdGxlOiAiU3VwZXJtZXJjYWRvcyB5IHN1IE1hcmtldCBCYXNrZXQgQW5hbHlzaXMiCmF1dGhvcjogIk1hcmNlbG8gVGFtIEFyaWNhIC0gQTAxNzIyMTQwIgpkYXRlOiAiMjAyMy0wMy0xNyIKb3V0cHV0OgogIGh0bWxfZG9jdW1lbnQ6CiAgICB0b2M6IHRydWUKICAgIHRvY19mbG9hdDogdHJ1ZQogICAgY29kZV9kb3dubG9hZDogdHJ1ZQotLS0KCiFbXSgvVXNlcnMvbWFyY2Vsb3RhbS9EZXNrdG9wL21hbmlwdWxhY2lvbiBkZSBkYXRvcy9zdXBlcm1lcmNhZG8uanBnKQoKIyBTdXBlcm1lcmNhZG9zCgojIyBJbXBvcnRhciBsaWJyZXJpYXMKYGBge3J9CmxpYnJhcnkoZHBseXIpCmxpYnJhcnkodGlkeXZlcnNlKQpsaWJyYXJ5KGphbml0b3IpCmxpYnJhcnkobHVicmlkYXRlKQpgYGAKCiMjIEltcG9ydGFyIGJhc2UgZGUgZGF0b3MKYGBge3J9CmJkc3VwZXIgPC0gcmVhZC5jc3YoIi9Vc2Vycy9tYXJjZWxvdGFtL0Rlc2t0b3AvbWFuaXB1bGFjaW9uIGRlIGRhdG9zL3N1cGVybWVyY2Fkby5jc3YiKQpgYGAKCiMjIEVudGVuZGVyIGxhIGJhc2UgZGUgZGF0b3MKYGBge3J9CnN1bW1hcnkoYmRzdXBlcikKCiNjb3VudChiZHN1cGVyLCBCaWxsTm8sIHNvcnQ9VFJVRSkKI2NvdW50KGJkc3VwZXIsIEl0ZW1uYW1lLCBzb3J0PVRSVUUpCiNjb3VudChiZHN1cGVyLCBQcmljZSwgc29ydD1UUlVFKQojY291bnQoYmRzdXBlciwgRGF0ZSwgc29ydD1UUlVFKQojY291bnQoYmRzdXBlciwgQ291bnRyeSwgc29ydD1UUlVFKQojY291bnQoYmRzdXBlciwgUHJvZHVjdG8sIHNvcnQ9VFJVRSkKCnRpYmJsZShiZHN1cGVyKQpoZWFkKGJkc3VwZXIsIG49NykKdGFpbChiZHN1cGVyLCBuPTcpCgp0YWJ5bChiZHN1cGVyLCBJdGVtbmFtZSwgQ291bnRyeSkKYGBgCgoqKkhhbGxhemdvcyoqCjEuIE5vIGhheSB1bmEgY29sdW1uYSBkZSByZXZlbnVlIAoyLiBIYXkgcHJlY2lvcyB5IGNhbnRpZGFkZXMgbmVnYXRpdm9zIFlBCjMuIEhheSBOQSdzIGVuIEN1c3RvbWVyIElECgojIyBMaW1waWFyIGJhc2UgZGUgZGF0b3MKYGBge3J9CgpgYGAKIyMgRW5jb250cmFyIGR1cGxpY2Fkb3MKYGBge3J9CmJkc3VwZXIxIDwtIGJkc3VwZXIKYmRzdXBlcjFbZHVwbGljYXRlZChiZHN1cGVyMSksXQpzdW0oZHVwbGljYXRlZChiZHN1cGVyMSkpCmBgYAoKI0AgRWxpbWluYXIgcmVuZ2xvbmVzIGR1cGxpY2Fkb3MKYGBge3J9CmJkc3VwZXIyIDwtIGJkc3VwZXIxCmJkc3VwZXIyIDwtIGRpc3RpbmN0KGJkc3VwZXIyKQoKYGBgCgojIyBQcmVjaW9zIGVuIGFic29sdXRvCmBgYHtyfQpiZHN1cGVyMyA8LSBiZHN1cGVyMgpiZHN1cGVyMyRQcmljZSA8LSBhYnMoYmRzdXBlcjMkUHJpY2UpICAgIApzdW1tYXJ5KGJkc3VwZXIzKQpgYGAKICAKIyMgQ2FudGlkYWRlcyBhIGVudGVyb3MKYGBge3J9CmJkc3VwZXI0IDwtIGJkc3VwZXIzCmJkc3VwZXI0JFF1YW50aXR5IDwtIGFicyhiZHN1cGVyNCRRdWFudGl0eSkKc3VtbWFyeShiZHN1cGVyNCkKYGBgCiAgCiMjIEVuY29udHJhciB2YWxvcmVzIE5BCmBgYHtyfQpiZHN1cGVyNSA8LSBiZHN1cGVyNApzdW0oaXMubmEoYmRzdXBlcjUpKQpzdW0oaXMubmEoYmRzdXBlcikpCmBgYAogIAojIyDCv0N1YW50b3MgTkEgdGVuZ28gcG9yIHZhcmlhYmxlPwpgYGB7cn0Kc2FwcGx5KGJkc3VwZXI1LCBmdW5jdGlvbih4KSBzdW0oaXMubmEoeCkpKQpgYGAKCiMjIFJlbXBsYXphciBsb3MgTkEgY29uIENFUk9TICgwKQpgYGB7cn0KYmRzdXBlcjYgPC0gYmRzdXBlcjUKYmRzdXBlcjZbaXMubmEoYmRzdXBlcjYpXSA8LSAwCnN1bW1hcnkoYmRzdXBlcjYpCmBgYAoKIyMgQWdyZWdhciBjb2x1bW5hIG51ZXZhIGRlICJSZXZlbnVlIgpgYGB7cn0KYmRzdXBlcjcgPC0gYmRzdXBlcjYKYmRzdXBlcjckUmV2ZW51ZSA8LSBiZHN1cGVyNyRQcmljZSAqIGJkc3VwZXI3JFF1YW50aXR5CnN1bW1hcnkoYmRzdXBlcjcpCmBgYAoKIyMgRXhwb3J0YXIgYmFzZSBkZSBkYXRvcyBsaW1waWEKYGBge3J9CmJkc3VwZXJfbGltcGlhIDwtIGJkc3VwZXI3CndyaXRlLmNzdihiZHN1cGVyX2xpbXBpYSwgZmlsZSA9ICJzdXBlcm1lcmNhZG9zX2JkbGltcGlhLmNzdiIsIHJvdy5uYW1lcyA9IEZBTFNFKQpgYGAKCiMgTWFya2V0IEJhc2tldCBBbmFseXNpcyBkZSBiYXNlIGRlIGRhdG9zIFN1cGVybWVyY2Fkb3MKCiMjIEltcG9ydGFyIGxpYnJlcmlhcwpgYGB7cn0KbGlicmFyeShwbHlyKQpsaWJyYXJ5KE1hdHJpeCkKbGlicmFyeShhcnVsZXMpCmxpYnJhcnkoYXJ1bGVzVml6KQpsaWJyYXJ5KGRhdGFzZXRzKQpgYGAKCiMjIEltcG9ydGFyIGJhc2UgZGUgZGF0b3MgbGltcGlhCmBgYHtyfQpiZHN1cGVyX2xpbXBpYSA8LSByZWFkLmNzdigiL1VzZXJzL21hcmNlbG90YW0vRGVza3RvcC9tYW5pcHVsYWNpb24gZGUgZGF0b3Mvc3VwZXJtZXJjYWRvc19iZGxpbXBpYS5jc3YiKQpgYGAKCiMjIE9yZGVuYXMgZGUgbWVub3IgYSBtYXlvciBsb3MgQmlsbE5vCmBgYHtyfQpiZHN1cGVyX2xpbXBpYSA8LSBiZHN1cGVyX2xpbXBpYVtvcmRlcihiZHN1cGVyX2xpbXBpYSRCaWxsTm8pLF0KaGVhZChiZHN1cGVyX2xpbXBpYSkKdGFpbChiZHN1cGVyX2xpbXBpYSkKYGBgCgojIyBFeHRyYWVyIHByb2R1Y3RvcyBwb3IgQmlsbE5vCmBgYHtyfQpiYXNrZXQgPC0gZGRwbHkoYmRzdXBlcl9saW1waWEsIGMoIkJpbGxObyIpLCBmdW5jdGlvbihiZHN1cGVyX2xpbXBpYSlwYXN0ZShiZHN1cGVyX2xpbXBpYSRJdGVtbmFtZSxjb2xsYXBzZT0iLCIpKQpgYGAKCiMjIEVsaW1pbmFyIG51bWVybyBkZSBCaWxsTm8KYGBge3J9CmJhc2tldCRCaWxsTm8gPC0gTlVMTApgYGAKCiMjIFJlbm9tYnJhciBlbCBub21icmUgZGUgbGEgY29sdW1uYSBtYXJjYQpgYGB7cn0KY29sbmFtZXMoYmFza2V0KSA8LSAoIlByb2R1Y3QiKQpgYGAKCiMjIEV4cG9ydGFyIGJhc2tldApgYGB7cn0Kd3JpdGUuY3N2KGJhc2tldCwgImJhc2tldHN1cGVyLmNzdiIsIHF1b3RlID0gRkFMU0UsIHJvdy5uYW1lcyA9IEZBTFNFKQpgYGAKCiMjIEltcG9ydGFyIHRyYW5zYWNjaW9uZXMKYGBge3J9CnRycyA8LSByZWFkLnRyYW5zYWN0aW9ucygiL1VzZXJzL21hcmNlbG90YW0vRGVza3RvcC9tYW5pcHVsYWNpb24gZGUgZGF0b3MvYmFza2V0c3VwZXIuY3N2IiwgZm9ybWF0ID0gImJhc2tldCIsIHNlcCA9ICIsIikKYGBgCgojIyBHZW5lcmFyIHJlZ2xhcyBkZSBhc29jaW9jaW9uCmBgYHtyfQpyZWdsYXNfYXNvY2lhY2lvbiA8LSBhcHJpb3JpKHRycywgcGFyYW1ldGVyID0gbGlzdChzdXBwPTAuMDAxLCBjb25mPTAuMiwgbWF4bGVuPTEwKSkKI3N1bW1hcnkocmVnbGFzX2Fzb2NpYWNpb24pCiNpbnNwZWN0KHJlZ2xhc19hc29jaWFjaW9uKQoKcmVnbGFzX2Fzb2NpYWNpb24gPC0gc29ydChyZWdsYXNfYXNvY2lhY2lvbiwgYnkgPSAiY29uZmlkZW5jZSIsIGRlY3JlYXNpbmcgPSBUUlVFKQojc3VtbWFyeShyZWdsYXNfYXNvY2lhY2lvbikKI2luc3BlY3QocmVnbGFzX2Fzb2NpYWNpb24pCgp0b3AxMHJlZ2xhcyA8LSBoZWFkKHJlZ2xhc19hc29jaWFjaW9uLCBuPTEwLCBieSA9ICJjb25maWRlbmNlIikKcGxvdCh0b3AxMHJlZ2xhcywgbWV0aG9kID0gImdyYXBoIiwgZW5naW5lID0gImh0bWx3aWRnZXQiKQpgYGAKCioqSGFsbGF6Z29zKioKCi0gQ2FkYSB2ZXogcXVlIGFsZ3VpZW4gc2UgbGxldmEgdW4gIkJpbGxib2FyZCBGb250IERlc2lnbiIgc2UgbGxldmFuIGVsICJXcmFwIi4KCi0gQ2FkYSB2ZXogcXVlIHNlIGxsZXZhbiB1biAiV29iYmx5IENoaWNrZW4iIHNlIGxsZXZhbiB1biAiTWV0YWwiIHkvbyAiRGVjb3JhdGlvbiIuCgotIENhZGEgdmV6IHF1ZSBzZSBsbGV2YW4gdW5hICJTaWx2ZXIgbWluaSB0YXBlIG1lYXN1cmUiIHNlIGxsZXZhbiB1bmEgIkx1bmNoIGJhZyBjYXJzIGJsdWUiLCAiSnVtbmJvIGJhZyBwaW5rIHZpbnRhZ2UgcGFpc2xleSIsICJTdHJhd2JlcnJ5IENoYXJsb3R0ZSBiYWciLgo=