Análisis de las ventas en abarrotes

Una empresa con tiendas en el pais solicita un analisis de sus ventas de abarrotes entre mayo y noviembre de 2020

Paso 0. Instalar paquetes y llamar 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)

Paso 1. Importar base de datos

bd<-read.csv("C:\\Users\\AVRIL\\Downloads\\abarrotes.csv")

Paso 2. Entender la base de datos

summary(bd)
##  vcClaveTienda        DescGiro         Codigo.Barras            PLU        
##  Length:200625      Length:200625      Min.   :8.347e+05   Min.   : 1.00   
##  Class :character   Class :character   1st Qu.:7.501e+12   1st Qu.: 1.00   
##  Mode  :character   Mode  :character   Median :7.501e+12   Median : 1.00   
##                                        Mean   :5.950e+12   Mean   : 2.11   
##                                        3rd Qu.:7.501e+12   3rd Qu.: 1.00   
##                                        Max.   :1.750e+13   Max.   :30.00   
##                                                            NA's   :199188  
##     Fecha               Hora              Marca            Fabricante       
##  Length:200625      Length:200625      Length:200625      Length:200625     
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##                                                                             
##    Producto             Precio          Ult.Costo         Unidades     
##  Length:200625      Min.   :-147.00   Min.   :  0.38   Min.   : 0.200  
##  Class :character   1st Qu.:  11.00   1st Qu.:  8.46   1st Qu.: 1.000  
##  Mode  :character   Median :  16.00   Median : 12.31   Median : 1.000  
##                     Mean   :  19.42   Mean   : 15.31   Mean   : 1.262  
##                     3rd Qu.:  25.00   3rd Qu.: 19.23   3rd Qu.: 1.000  
##                     Max.   :1000.00   Max.   :769.23   Max.   :96.000  
##                                                                        
##     F.Ticket      NombreDepartamento NombreFamilia      NombreCategoria   
##  Min.   :     1   Length:200625      Length:200625      Length:200625     
##  1st Qu.: 33964   Class :character   Class :character   Class :character  
##  Median :105993   Mode  :character   Mode  :character   Mode  :character  
##  Mean   :193990                                                           
##  3rd Qu.:383005                                                           
##  Max.   :450040                                                           
##                                                                           
##     Estado              Mts.2      Tipo.ubicación         Giro          
##  Length:200625      Min.   :47.0   Length:200625      Length:200625     
##  Class :character   1st Qu.:53.0   Class :character   Class :character  
##  Mode  :character   Median :60.0   Mode  :character   Mode  :character  
##                     Mean   :56.6                                        
##                     3rd Qu.:60.0                                        
##                     Max.   :62.0                                        
##                                                                         
##  Hora.inicio        Hora.cierre       
##  Length:200625      Length:200625     
##  Class :character   Class :character  
##  Mode  :character   Mode  :character  
##                                       
##                                       
##                                       
## 
#count(bd,vcClaveTienda,sort=TRUE)
#count(bd,DesGiro,sort=TRUE)
#count(bd,Marca,sort=TRUE)
#count(bd,Fabricante,sort=TRUE)
#count(bd,Producto,sort=TRUE)
#count(bd,NombreDepartamento,sort=TRUE)
#count(bd,NombreFamilia,sort=TRUE)
#count(bd,NombreCategoria,sort=TRUE)
#count(bd,Estado,sort=TRUE)
#count(bd,Tipo.ubicación,sort=TRUE)
#count(bd,Giro,sort=TRUE)
#count(bd,Hora.inicio,sort=TRUE)
#count(bd,Hora.cierre,sort=TRUE)

Paso 3. Hacer resumenes de tabla (a partir de una tabla crear otra nueva)

tibble(bd)
## # A tibble: 200,625 × 22
##    vcClaveTienda DescGiro Codig…¹   PLU Fecha Hora  Marca Fabri…² Produ…³ Precio
##    <chr>         <chr>      <dbl> <int> <chr> <chr> <chr> <chr>   <chr>    <dbl>
##  1 MX001         Abarrot… 7.50e12    NA 19/0… 08:1… NUTR… MEXILAC Nutri …   16  
##  2 MX001         Abarrot… 7.50e12    NA 19/0… 08:2… DAN … DANONE… DANUP …   14  
##  3 MX001         Abarrot… 7.50e12    NA 19/0… 08:2… BIMBO GRUPO … Rebana…    5  
##  4 MX001         Abarrot… 7.50e12    NA 19/0… 08:2… PEPSI PEPSI-… Pepsi …    8  
##  5 MX001         Abarrot… 7.50e12    NA 19/0… 08:2… BLAN… FABRIC… Deterg…   19.5
##  6 MX001         Abarrot… 7.50e12    NA 19/0… 08:1… NUTR… MEXILAC Nutri …   16  
##  7 MX001         Abarrot… 7.50e12    NA 19/0… 08:2… DAN … DANONE… DANUP …   14  
##  8 MX001         Abarrot… 7.50e12    NA 19/0… 08:2… BIMBO GRUPO … Rebana…    5  
##  9 MX001         Abarrot… 7.50e12    NA 19/0… 08:2… PEPSI PEPSI-… Pepsi …    8  
## 10 MX001         Abarrot… 7.50e12    NA 19/0… 08:2… BLAN… FABRIC… Deterg…   19.5
## # … with 200,615 more rows, 12 more variables: Ult.Costo <dbl>, Unidades <dbl>,
## #   F.Ticket <int>, NombreDepartamento <chr>, NombreFamilia <chr>,
## #   NombreCategoria <chr>, Estado <chr>, Mts.2 <int>, Tipo.ubicación <chr>,
## #   Giro <chr>, Hora.inicio <chr>, Hora.cierre <chr>, and abbreviated variable
## #   names ¹​Codigo.Barras, ²​Fabricante, ³​Producto
head(bd)
##   vcClaveTienda  DescGiro Codigo.Barras PLU      Fecha     Hora
## 1         MX001 Abarrotes  7.501021e+12  NA 19/06/2020 08:16:21
## 2         MX001 Abarrotes  7.501032e+12  NA 19/06/2020 08:23:33
## 3         MX001 Abarrotes  7.501000e+12  NA 19/06/2020 08:24:33
## 4         MX001 Abarrotes  7.501031e+12  NA 19/06/2020 08:24:33
## 5         MX001 Abarrotes  7.501026e+12  NA 19/06/2020 08:26:28
## 6         MX001 Abarrotes  7.501021e+12  NA 19/06/2020 08:16:21
##                        Marca                 Fabricante
## 1                NUTRI LECHE                    MEXILAC
## 2                     DAN UP           DANONE DE MEXICO
## 3                      BIMBO                GRUPO BIMBO
## 4                      PEPSI        PEPSI-COLA MEXICANA
## 5 BLANCA NIEVES (DETERGENTE) FABRICA DE JABON LA CORONA
## 6                NUTRI LECHE                    MEXILAC
##                             Producto Precio Ult.Costo Unidades F.Ticket
## 1                Nutri Leche 1 Litro   16.0     12.31        1        1
## 2 DANUP STRAWBERRY P/BEBER 350GR NAL   14.0     14.00        1        2
## 3                Rebanadas Bimbo 2Pz    5.0      5.00        1        3
## 4                   Pepsi N.R. 400Ml    8.0      8.00        1        3
## 5      Detergente Blanca Nieves 500G   19.5     15.00        1        4
## 6                Nutri Leche 1 Litro   16.0     12.31        1        1
##   NombreDepartamento          NombreFamilia           NombreCategoria
## 1          Abarrotes Lacteos y Refrigerados                     Leche
## 2          Abarrotes Lacteos y Refrigerados                    Yogurt
## 3          Abarrotes         Pan y Tortilla     Pan Dulce Empaquetado
## 4          Abarrotes                Bebidas Refrescos Plástico (N.R.)
## 5          Abarrotes     Limpieza del Hogar                Lavandería
## 6          Abarrotes Lacteos y Refrigerados                     Leche
##       Estado Mts.2 Tipo.ubicación      Giro Hora.inicio Hora.cierre
## 1 Nuevo León    60        Esquina Abarrotes       08:00       22:00
## 2 Nuevo León    60        Esquina Abarrotes       08:00       22:00
## 3 Nuevo León    60        Esquina Abarrotes       08:00       22:00
## 4 Nuevo León    60        Esquina Abarrotes       08:00       22:00
## 5 Nuevo León    60        Esquina Abarrotes       08:00       22:00
## 6 Nuevo León    60        Esquina Abarrotes       08:00       22:00
tail(bd,n=7)
##        vcClaveTienda DescGiro Codigo.Barras PLU      Fecha     Hora
## 200619         MX005 Depósito   7.62221e+12  NA 12/07/2020 00:36:34
## 200620         MX005 Depósito   7.62221e+12  NA 12/07/2020 01:08:25
## 200621         MX005 Depósito   7.62221e+12  NA 23/10/2020 22:17:37
## 200622         MX005 Depósito   7.62221e+12  NA 10/10/2020 20:30:20
## 200623         MX005 Depósito   7.62221e+12  NA 10/10/2020 22:40:43
## 200624         MX005 Depósito   7.62221e+12  NA 27/06/2020 22:30:19
## 200625         MX005 Depósito   7.62221e+12  NA 26/06/2020 23:43:34
##                    Marca    Fabricante                          Producto Precio
## 200619 TRIDENT XTRA CARE CADBURY ADAMS Trident Xtracare Freshmint 16.32G      9
## 200620 TRIDENT XTRA CARE CADBURY ADAMS Trident Xtracare Freshmint 16.32G      9
## 200621 TRIDENT XTRA CARE CADBURY ADAMS Trident Xtracare Freshmint 16.32G      9
## 200622 TRIDENT XTRA CARE CADBURY ADAMS Trident Xtracare Freshmint 16.32G      9
## 200623 TRIDENT XTRA CARE CADBURY ADAMS Trident Xtracare Freshmint 16.32G      9
## 200624 TRIDENT XTRA CARE CADBURY ADAMS Trident Xtracare Freshmint 16.32G      9
## 200625 TRIDENT XTRA CARE CADBURY ADAMS Trident Xtracare Freshmint 16.32G      9
##        Ult.Costo Unidades F.Ticket NombreDepartamento NombreFamilia
## 200619      6.92        1   103087          Abarrotes      Dulcería
## 200620      6.92        1   103100          Abarrotes      Dulcería
## 200621      6.92        1   116598          Abarrotes      Dulcería
## 200622      6.92        1   114886          Abarrotes      Dulcería
## 200623      6.92        1   114955          Abarrotes      Dulcería
## 200624      6.92        1   101121          Abarrotes      Dulcería
## 200625      6.92        1   100879          Abarrotes      Dulcería
##        NombreCategoria       Estado Mts.2 Tipo.ubicación       Giro Hora.inicio
## 200619 Gomas de Mazcar Quintana Roo    58        Esquina Mini súper       08:00
## 200620 Gomas de Mazcar Quintana Roo    58        Esquina Mini súper       08:00
## 200621 Gomas de Mazcar Quintana Roo    58        Esquina Mini súper       08:00
## 200622 Gomas de Mazcar Quintana Roo    58        Esquina Mini súper       08:00
## 200623 Gomas de Mazcar Quintana Roo    58        Esquina Mini súper       08:00
## 200624 Gomas de Mazcar Quintana Roo    58        Esquina Mini súper       08:00
## 200625 Gomas de Mazcar Quintana Roo    58        Esquina Mini súper       08:00
##        Hora.cierre
## 200619       21:00
## 200620       21:00
## 200621       21:00
## 200622       21:00
## 200623       21:00
## 200624       21:00
## 200625       21:00
tabyl(bd,vcClaveTienda,NombreDepartamento)
##  vcClaveTienda Abarrotes Bebes e Infantiles Carnes Farmacia Ferretería Mercería
##          MX001     95415                515      1      147        245       28
##          MX002      6590                 21      0        4         10        0
##          MX003      4026                 15      0        2          8        0
##          MX004     82234                932      0      102        114       16
##          MX005     10014                  0      0        0          0        0
##  Papelería Productos a Eliminar Vinos y Licores
##         35                    3              80
##          0                    0               4
##          0                    0               0
##         32                    5              20
##          7                    0               0
tabyl(bd,NombreFamilia,vcClaveTienda)
##              NombreFamilia MX001 MX002 MX003 MX004 MX005
##                 Accesorios    88     0     0    58     0
##                     Aceite   346    29    18  1088     2
##                   Aderezos   544    21    30   909     3
##                    Alcohol     6     2     0     8     0
##                 Alimentos    256     9    15   530     0
##         Alimentos a Granel     1     0     0     0     0
##    Alimentos para Mascotas   300     9    36   533     0
##                Analgésicos     0     0     1     0     0
##                  Antiácido     0     0     1     0     0
##                 Antigripal    17     0     0    40     0
##     Artículos de Escritura     0     0     0     6     0
##              Azúcar y Miel   349     0     0    38     4
##                    Bebidas 38511  3416  1460 21504    27
##       Bebidas Premezcladas     0     4     0    19     0
##                    Botanas 13051  1194   498  5724  1116
##  C. Frías y Salchichonería   451     1   143  1528     0
##                   Cereales   533     7    10   210     0
##                    Cerveza  4644   196    26  1041  8110
##                   Cigarros  3775   451    75  2237   279
##                  Cuadernos     7     0     0     8     0
##           Cuidado Personal  1940   117    40  3319    17
##             Dermatológicos    33     1     0    20     0
##                Desechables   809    38    25  2588     0
##                   Dulcería  1725    45   108   486   307
##                   Especias  1596    28    22  3249    26
##                   Galletas  3259   218   256  3754     0
##          Granos y Semillas  1138    18    19  1488     0
##     Harinas y Complementos   460    20    43  1237     0
##     Lacteos y Refrigerados  6795   139   503 10221     1
##                    Latería  1540    90   108  3365     4
##         Limpieza del Hogar  3771   295   172  4470    16
##                   Mantecas   203     7     6   581     0
##       Material de Curación    46     0     0    11     0
##    Materiales y Accesorios    28     0     0    18     7
##             Pan y Tortilla  5782    39   294  4387     0
##                    Pañales   114     8     0   215     0
##                 Pegamentos   104     8     6   102     0
##   Pilas para uso Doméstico   141     2     2    12     0
##                      Pollo     1     0     0     0     0
##                    Postres    29     0     2    56     0
##       Productos Higiénicos    57     4     0   129     0
##      Productos sin Familia     3     0     0     5     0
##                        Ron     1     0     0     0     0
##       Salsas y Sazonadores  1550    94    59  3527    90
##                    Sangría    13     0     0     0     0
##             Sopas y Pastas  1280    65    37  2749    10
##       Te, Chocolate y Café   454    42    27   906     2
##                    Tequila    62     0     0     1     0
##                     Varios    73     1     0    39     0
##          Velas y Veladoras   579    11     9  1039     0
##                     Whisky     4     0     0     0     0

Hallazgos
1.Fechas y horas estan en formato de caracter
2.Hay precios negativos
3.No hay columna de ventas

Paso 4. Limpiar la base de datos
Existen 6 técnicas para limpiar datos

#Técnica 1. Remover valores irrelevantes

#Eliminar columnas
bd1<-bd
bd1<-subset(bd1,select=-c(PLU,Codigo.Barras))
#Eliminar renglones
bd2<-bd1
bd2<-bd2[bd2$Precio>0,]
summary(bd2)
##  vcClaveTienda        DescGiro            Fecha               Hora          
##  Length:200478      Length:200478      Length:200478      Length:200478     
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##     Marca            Fabricante          Producto             Precio       
##  Length:200478      Length:200478      Length:200478      Min.   :   0.50  
##  Class :character   Class :character   Class :character   1st Qu.:  11.00  
##  Mode  :character   Mode  :character   Mode  :character   Median :  16.00  
##                                                           Mean   :  19.45  
##                                                           3rd Qu.:  25.00  
##                                                           Max.   :1000.00  
##    Ult.Costo         Unidades         F.Ticket      NombreDepartamento
##  Min.   :  0.38   Min.   : 0.200   Min.   :     1   Length:200478     
##  1st Qu.:  8.46   1st Qu.: 1.000   1st Qu.: 33977   Class :character  
##  Median : 12.31   Median : 1.000   Median :106034   Mode  :character  
##  Mean   : 15.31   Mean   : 1.261   Mean   :194096                     
##  3rd Qu.: 19.23   3rd Qu.: 1.000   3rd Qu.:383062                     
##  Max.   :769.23   Max.   :96.000   Max.   :450040                     
##  NombreFamilia      NombreCategoria       Estado              Mts.2     
##  Length:200478      Length:200478      Length:200478      Min.   :47.0  
##  Class :character   Class :character   Class :character   1st Qu.:53.0  
##  Mode  :character   Mode  :character   Mode  :character   Median :60.0  
##                                                           Mean   :56.6  
##                                                           3rd Qu.:60.0  
##                                                           Max.   :62.0  
##  Tipo.ubicación         Giro           Hora.inicio        Hora.cierre       
##  Length:200478      Length:200478      Length:200478      Length:200478     
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
## 

#Técnica 2. Remover valores duplicados

#Identificar renglones duplicados
bd2[duplicated(bd2),]
##    vcClaveTienda  DescGiro      Fecha     Hora                      Marca
## 6          MX001 Abarrotes 19/06/2020 08:16:21                NUTRI LECHE
## 7          MX001 Abarrotes 19/06/2020 08:23:33                     DAN UP
## 8          MX001 Abarrotes 19/06/2020 08:24:33                      BIMBO
## 9          MX001 Abarrotes 19/06/2020 08:24:33                      PEPSI
## 10         MX001 Abarrotes 19/06/2020 08:26:28 BLANCA NIEVES (DETERGENTE)
##                    Fabricante                           Producto Precio
## 6                     MEXILAC                Nutri Leche 1 Litro   16.0
## 7            DANONE DE MEXICO DANUP STRAWBERRY P/BEBER 350GR NAL   14.0
## 8                 GRUPO BIMBO                Rebanadas Bimbo 2Pz    5.0
## 9         PEPSI-COLA MEXICANA                   Pepsi N.R. 400Ml    8.0
## 10 FABRICA DE JABON LA CORONA      Detergente Blanca Nieves 500G   19.5
##    Ult.Costo Unidades F.Ticket NombreDepartamento          NombreFamilia
## 6      12.31        1        1          Abarrotes Lacteos y Refrigerados
## 7      14.00        1        2          Abarrotes Lacteos y Refrigerados
## 8       5.00        1        3          Abarrotes         Pan y Tortilla
## 9       8.00        1        3          Abarrotes                Bebidas
## 10     15.00        1        4          Abarrotes     Limpieza del Hogar
##              NombreCategoria     Estado Mts.2 Tipo.ubicación      Giro
## 6                      Leche Nuevo León    60        Esquina Abarrotes
## 7                     Yogurt Nuevo León    60        Esquina Abarrotes
## 8      Pan Dulce Empaquetado Nuevo León    60        Esquina Abarrotes
## 9  Refrescos Plástico (N.R.) Nuevo León    60        Esquina Abarrotes
## 10                Lavandería Nuevo León    60        Esquina Abarrotes
##    Hora.inicio Hora.cierre
## 6        08:00       22:00
## 7        08:00       22:00
## 8        08:00       22:00
## 9        08:00       22:00
## 10       08:00       22:00
sum(duplicated(bd2))
## [1] 5
#Eliminar renglones duplicados
bd3<-bd2
bd3<-distinct(bd3)
bd3
##      vcClaveTienda  DescGiro      Fecha     Hora                          Marca
## 1            MX001 Abarrotes 19/06/2020 08:16:21                    NUTRI LECHE
## 2            MX001 Abarrotes 19/06/2020 08:23:33                         DAN UP
## 3            MX001 Abarrotes 19/06/2020 08:24:33                          BIMBO
## 4            MX001 Abarrotes 19/06/2020 08:24:33                          PEPSI
## 5            MX001 Abarrotes 19/06/2020 08:26:28     BLANCA NIEVES (DETERGENTE)
## 6            MX001 Abarrotes 19/06/2020 08:26:28                          FLASH
## 7            MX001 Abarrotes 19/06/2020 08:26:28                  VARIOS DANONE
## 8            MX001 Abarrotes 19/06/2020 08:26:28                           ZOTE
## 9            MX001 Abarrotes 19/06/2020 08:26:28                         ALWAYS
## 10           MX001 Abarrotes 19/06/2020 15:24:02                          JUMEX
## 11           MX001 Abarrotes 19/06/2020 15:24:02                          PEPSI
## 12           MX001 Abarrotes 19/06/2020 08:37:15                     VALLE FRUT
## 13           MX001 Abarrotes 19/06/2020 15:26:26                          PEPSI
## 14           MX001 Abarrotes 19/06/2020 08:38:50                       MARINELA
## 15           MX001 Abarrotes 19/06/2020 08:38:50                           LALA
## 16           MX001 Abarrotes 19/06/2020 08:38:50                          MAMUT
## 17           MX001 Abarrotes 19/06/2020 08:45:00                           LALA
## 18           MX001 Abarrotes 19/06/2020 08:51:44                            ACE
## 19           MX001 Abarrotes 19/06/2020 08:51:44                           LALA
## 20           MX001 Abarrotes 19/06/2020 08:51:44                        ENSUEÑO
## 21           MX001 Abarrotes 19/06/2020 08:51:44                         CHIMEX
## 22           MX001 Abarrotes 19/06/2020 08:53:08                    NUTRI LECHE
## 23           MX001 Abarrotes 19/06/2020 08:53:47                      DEL VALLE
## 24           MX001 Abarrotes 19/06/2020 08:56:50                      COCA COLA
## 25           MX001 Abarrotes 19/06/2020 15:44:06                       MARINELA
## 26           MX001 Abarrotes 19/06/2020 15:44:06                      COCA COLA
## 27           MX001 Abarrotes 19/06/2020 08:58:40                          JUMEX
## 28           MX001 Abarrotes 19/06/2020 15:44:06                         SPRITE
## 29           MX001 Abarrotes 19/06/2020 08:59:34                    NUTRI LECHE
## 30           MX001 Abarrotes 19/06/2020 08:59:34                            FUD
## 31           MX001 Abarrotes 19/06/2020 15:44:39                          PEPSI
## 32           MX001 Abarrotes 19/06/2020 08:59:34                    NUTRI LECHE
## 33           MX001 Abarrotes 19/06/2020 09:02:48                       MARINELA
## 34           MX001 Abarrotes 19/06/2020 09:07:17                    PERMA SHARP
## 35           MX001 Abarrotes 19/06/2020 15:47:46                           JOYA
## 36           MX001 Abarrotes 19/06/2020 09:17:03                    NUTRI LECHE
## 37           MX001 Abarrotes 19/06/2020 15:50:29                      COCA COLA
## 38           MX001 Abarrotes 19/06/2020 15:50:29                          BIMBO
## 39           MX001 Abarrotes 19/06/2020 09:21:21                      COCA COLA
## 40           MX001 Abarrotes 19/06/2020 09:21:21                      COCA COLA
## 41           MX001 Abarrotes 19/06/2020 09:21:21                          BIMBO
## 42           MX001 Abarrotes 19/06/2020 15:51:52                EL GALLO DE ORO
## 43           MX001 Abarrotes 19/06/2020 15:51:52                      COCA COLA
## 44           MX001 Abarrotes 19/06/2020 15:52:21                       CLORALEX
## 45           MX001 Abarrotes 19/06/2020 09:21:37                      COCA COLA
## 46           MX001 Abarrotes 19/06/2020 09:24:20                        YOPLAIT
## 47           MX001 Abarrotes 19/06/2020 15:52:44                          PEPSI
## 48           MX001 Abarrotes 19/06/2020 09:24:20                         SAVILE
## 49           MX001 Abarrotes 19/06/2020 09:28:05                      COCA COLA
## 50           MX001 Abarrotes 19/06/2020 09:32:28                     VALLE FRUT
## 51           MX001 Abarrotes 19/06/2020 09:34:00                          PEPSI
## 52           MX001 Abarrotes 19/06/2020 15:57:53                        RUFFLES
## 53           MX001 Abarrotes 19/06/2020 15:57:53                       SABRITAS
## 54           MX001 Abarrotes 19/06/2020 15:57:53                      COCA COLA
## 55           MX001 Abarrotes 19/06/2020 09:35:44                    NUTRI LECHE
## 56           MX001 Abarrotes 19/06/2020 09:38:50                          PEPSI
## 57           MX001 Abarrotes 19/06/2020 09:39:17                      COCA COLA
## 58           MX001 Abarrotes 19/06/2020 16:00:30                          KRAFT
## 59           MX001 Abarrotes 19/06/2020 09:39:17                        CHEETOS
## 60           MX001 Abarrotes 19/06/2020 16:02:01                      COCA COLA
## 61           MX001 Abarrotes 19/06/2020 16:02:01                      COCA COLA
## 62           MX001 Abarrotes 19/06/2020 16:04:13                          PEPSI
## 63           MX001 Abarrotes 19/06/2020 09:42:59                           LALA
## 64           MX001 Abarrotes 19/06/2020 09:42:59                          PEPSI
## 65           MX001 Abarrotes 19/06/2020 16:08:35                          PEPSI
## 66           MX001 Abarrotes 19/06/2020 16:09:11                COCA COLA LIGHT
## 67           MX001 Abarrotes 19/06/2020 16:09:11                 COCA COLA ZERO
## 68           MX001 Abarrotes 19/06/2020 09:46:49     BLANCA NIEVES (DETERGENTE)
## 69           MX001 Abarrotes 19/06/2020 09:46:49                          JUMEX
## 70           MX001 Abarrotes 19/06/2020 09:46:49                       CLORALEX
## 71           MX001 Abarrotes 19/06/2020 09:46:49                  MANZANITA SOL
## 72           MX001 Abarrotes 19/06/2020 09:47:11                        CHEETOS
## 73           MX001 Abarrotes 19/06/2020 16:13:02                        KINDER 
## 74           MX001 Abarrotes 19/06/2020 09:52:34                      COCA COLA
## 75           MX001 Abarrotes 19/06/2020 09:55:39                       FRUTIMAX
## 76           MX001 Abarrotes 19/06/2020 16:21:17                       PRINGLES
## 77           MX001 Abarrotes 19/06/2020 16:21:17                CREMAX DE NIEVE
## 78           MX001 Abarrotes 19/06/2020 10:02:08                          EPURA
## 79           MX001 Abarrotes 19/06/2020 16:22:50                       DIAMANTE
## 80           MX001 Abarrotes 19/06/2020 10:04:31                      COCA COLA
## 81           MX001 Abarrotes 19/06/2020 10:12:26                          PEPSI
## 82           MX001 Abarrotes 19/06/2020 16:25:18                       SABRITAS
## 83           MX001 Abarrotes 19/06/2020 16:25:18                          PEPSI
## 84           MX001 Abarrotes 19/06/2020 16:25:47                        DORITOS
## 85           MX001 Abarrotes 19/06/2020 16:25:47                      COCA COLA
## 86           MX001 Abarrotes 19/06/2020 10:18:26                       KOLALOKA
## 87           MX001 Abarrotes 19/06/2020 10:18:26                        TRIDENT
## 88           MX001 Abarrotes 19/06/2020 10:19:24                      COCA COLA
## 89           MX001 Abarrotes 19/06/2020 16:27:41                      COCA COLA
## 90           MX001 Abarrotes 19/06/2020 10:20:17                           LALA
## 91           MX001 Abarrotes 19/06/2020 16:27:41                       BONAFONT
## 92           MX001 Abarrotes 19/06/2020 16:28:28                        CHEETOS
## 93           MX001 Abarrotes 19/06/2020 10:27:46                          PEPSI
## 94           MX001 Abarrotes 19/06/2020 16:54:17                      COCA COLA
## 95           MX001 Abarrotes 19/06/2020 16:58:07                  CAZO MEXICANO
## 96           MX001 Abarrotes 19/06/2020 10:40:34                        DORITOS
## 97           MX001 Abarrotes 19/06/2020 10:40:34                         GAMESA
## 98           MX001 Abarrotes 19/06/2020 10:40:34                          EPURA
## 99           MX001 Abarrotes 19/06/2020 10:43:09                          ORBIT
## 100          MX001 Abarrotes 19/06/2020 18:23:04                     VALLE FRUT
## 101          MX001 Abarrotes 19/06/2020 18:27:06                       SABRITAS
## 102          MX001 Abarrotes 19/06/2020 10:48:51                      COCA COLA
## 103          MX001 Abarrotes 19/06/2020 18:27:06                       CRUJITOS
## 104          MX001 Abarrotes 19/06/2020 10:54:07                          PEPSI
## 105          MX001 Abarrotes 19/06/2020 18:27:29                      COCA COLA
## 106          MX001 Abarrotes 19/06/2020 11:01:01                          PEPSI
## 107          MX001 Abarrotes 19/06/2020 11:01:01                COCA COLA LIGHT
## 108          MX001 Abarrotes 19/06/2020 18:29:13                       TOSTITOS
## 109          MX001 Abarrotes 19/06/2020 11:04:45     BLANCA NIEVES (DETERGENTE)
## 110          MX001 Abarrotes 19/06/2020 19:27:09                       POWERADE
## 111          MX001 Abarrotes 19/06/2020 11:05:14                      COCA COLA
## 112          MX001 Abarrotes 19/06/2020 19:28:06                            EGO
## 113          MX001 Abarrotes 19/06/2020 19:41:11                         NUGGET
## 114          MX001 Abarrotes 19/06/2020 19:58:47                          PEPSI
## 115          MX001 Abarrotes 19/06/2020 11:10:12                          PEPSI
## 116          MX001 Abarrotes 19/06/2020 20:01:31                   BUBBA XTREME
## 117          MX001 Abarrotes 19/06/2020 20:01:31                          LUCAS
## 118          MX001 Abarrotes 19/06/2020 20:01:31                       BUBBALOO
## 119          MX001 Abarrotes 19/06/2020 11:12:39                          BIMBO
## 120          MX001 Abarrotes 19/06/2020 20:06:13                           LINK
## 121          MX001 Abarrotes 19/06/2020 11:12:39                     VALLE FRUT
## 122          MX001 Abarrotes 19/06/2020 11:13:35                          PEPSI
## 123          MX001 Abarrotes 19/06/2020 20:16:28                          LUCAS
## 124          MX001 Abarrotes 19/06/2020 20:24:39                EL GALLO DE ORO
## 125          MX001 Abarrotes 19/06/2020 20:29:13                          BEBIN
## 126          MX001 Abarrotes 19/06/2020 11:20:34                          BIMBO
## 127          MX001 Abarrotes 19/06/2020 20:51:33                          BIMBO
## 128          MX001 Abarrotes 19/06/2020 11:27:27                       BONAFONT
## 129          MX001 Abarrotes 19/06/2020 20:52:06                      COCA COLA
## 130          MX001 Abarrotes 19/06/2020 21:07:53                          BEBIN
## 131          MX001 Abarrotes 19/06/2020 21:07:53                       DANONINO
## 132          MX001 Abarrotes 19/06/2020 21:07:53                       FRUTIMAX
## 133          MX001 Abarrotes 19/06/2020 21:08:43                          PEPSI
## 134          MX001 Abarrotes 19/06/2020 21:09:13                       PAKETAXO
## 135          MX001 Abarrotes 19/06/2020 11:32:05                            FUD
## 136          MX001 Abarrotes 19/06/2020 21:09:13                          PEPSI
## 137          MX001 Abarrotes 19/06/2020 21:10:58                        CHEETOS
## 138          MX001 Abarrotes 19/06/2020 21:10:58                          BIMBO
## 139          MX001 Abarrotes 19/06/2020 21:10:58                      COCA COLA
## 140          MX001 Abarrotes 19/06/2020 21:10:58                      DEL MONTE
## 141          MX001 Abarrotes 19/06/2020 11:33:41                          PEPSI
## 142          MX001 Abarrotes 19/06/2020 21:11:39                VELADORA MEXICO
## 143          MX001 Abarrotes 19/06/2020 11:38:55                          PEPSI
## 144          MX001 Abarrotes 19/06/2020 11:39:51                          PEPSI
## 145          MX001 Abarrotes 19/06/2020 21:12:40                      COCA COLA
## 146          MX001 Abarrotes 19/06/2020 21:12:40                      CONVERMEX
## 147          MX001 Abarrotes 19/06/2020 21:13:56                     DEL FUERTE
## 148          MX001 Abarrotes 19/06/2020 11:42:07                       PAKETAXO
## 149          MX001 Abarrotes 19/06/2020 11:42:07                         GAMESA
## 150          MX001 Abarrotes 19/06/2020 21:16:20                          PEPSI
## 151          MX001 Abarrotes 19/06/2020 11:43:39                       MARIPOSA
## 152          MX001 Abarrotes 19/06/2020 21:22:23                    NUTRI LECHE
## 153          MX001 Abarrotes 19/06/2020 11:49:25                        CHEETOS
## 154          MX001 Abarrotes 19/06/2020 21:22:23                        DORITOS
## 155          MX001 Abarrotes 19/06/2020 11:49:25                      COCA COLA
## 156          MX001 Abarrotes 19/06/2020 11:49:53                        ENSUEÑO
## 157          MX001 Abarrotes 19/06/2020 11:49:53                      COCA COLA
## 158          MX001 Abarrotes 19/06/2020 21:24:31                       MARINELA
## 159          MX001 Abarrotes 19/06/2020 21:24:31                       SEVEN UP
## 160          MX001 Abarrotes 19/06/2020 11:52:08                          PEPSI
## 161          MX001 Abarrotes 19/06/2020 11:52:39                       SABRITAS
## 162          MX001 Abarrotes 19/06/2020 21:27:12                          PEPSI
## 163          MX001 Abarrotes 19/06/2020 21:29:45                COCA COLA LIGHT
## 164          MX001 Abarrotes 19/06/2020 11:56:13                      COCA COLA
## 165          MX001 Abarrotes 19/06/2020 11:57:50                       MARINELA
## 166          MX001 Abarrotes 19/06/2020 21:35:23                       POWERADE
## 167          MX001 Abarrotes 19/06/2020 21:35:56                         SQUIRT
## 168          MX001 Abarrotes 19/06/2020 21:37:07                           LALA
## 169          MX001 Abarrotes 19/06/2020 12:01:54                          PEPSI
## 170          MX001 Abarrotes 19/06/2020 21:37:43                           ZOTE
## 171          MX001 Abarrotes 19/06/2020 21:37:43                         CIERVO
## 172          MX001 Abarrotes 19/06/2020 21:39:08                          BIMBO
## 173          MX001 Abarrotes 19/06/2020 12:08:57                           JOYA
## 174          MX001 Abarrotes 19/06/2020 12:11:03                        YOPLAIT
## 175          MX001 Abarrotes 19/06/2020 21:53:14                       SABRITAS
## 176          MX001 Abarrotes 19/06/2020 21:53:14                      COCA COLA
## 177          MX001 Abarrotes 19/06/2020 12:12:34                        MIRINDA
## 178          MX001 Abarrotes 19/06/2020 21:56:38                        CHEETOS
## 179          MX001 Abarrotes 19/06/2020 21:57:57                        CHEETOS
## 180          MX001 Abarrotes 19/06/2020 22:01:50                          KNORR
## 181          MX001 Abarrotes 19/06/2020 22:01:50                          AXION
## 182          MX001 Abarrotes 19/06/2020 22:02:27                        CHEETOS
## 183          MX001 Abarrotes 19/06/2020 12:17:37                           FOCA
## 184          MX001 Abarrotes 19/06/2020 22:02:27                     VALLE FRUT
## 185          MX001 Abarrotes 19/06/2020 12:22:03                      COCA COLA
## 186          MX001 Abarrotes 19/06/2020 22:03:06                           LINK
## 187          MX001 Abarrotes 19/06/2020 22:04:23                        DORITOS
## 188          MX001 Abarrotes 19/06/2020 22:04:23                          BIMBO
## 189          MX001 Abarrotes 19/06/2020 22:04:23                          BIMBO
## 190          MX001 Abarrotes 19/06/2020 22:04:23                          BIMBO
## 191          MX001 Abarrotes 19/06/2020 22:04:23                          BIMBO
## 192          MX001 Abarrotes 19/06/2020 22:04:23                       PAKETAXO
## 193          MX001 Abarrotes 19/06/2020 22:08:28                        BOKADOS
## 194          MX001 Abarrotes 19/06/2020 12:24:48                          PEPSI
## 195          MX001 Abarrotes 19/06/2020 22:09:14                       SABRITAS
## 196          MX001 Abarrotes 19/06/2020 12:34:23                          PEPSI
## 197          MX001 Abarrotes 19/06/2020 22:09:48                           TANG
## 198          MX001 Abarrotes 19/06/2020 22:13:01                          PEPSI
## 199          MX001 Abarrotes 19/06/2020 22:16:30                        MONARCA
## 200          MX001 Abarrotes 19/06/2020 22:18:16                        BOKADOS
## 201          MX001 Abarrotes 19/06/2020 22:18:16                           GIRO
## 202          MX001 Abarrotes 19/06/2020 22:26:09                        PRISPAS
## 203          MX001 Abarrotes 19/06/2020 22:26:09                        RUFFLES
## 204          MX001 Abarrotes 19/06/2020 22:26:09                        DORITOS
## 205          MX001 Abarrotes 19/06/2020 12:57:29                          PEPSI
## 206          MX001 Abarrotes 19/06/2020 22:27:41                      CONVERMEX
## 207          MX001 Abarrotes 19/06/2020 22:27:41                      CONVERMEX
## 208          MX001 Abarrotes 19/06/2020 12:58:25                          BIMBO
## 209          MX001 Abarrotes 19/06/2020 12:58:25                     BLUE HOUSE
## 210          MX001 Abarrotes 19/06/2020 12:58:25                      COCA COLA
## 211          MX001 Abarrotes 19/06/2020 22:29:58                         DANONE
## 212          MX001 Abarrotes 19/06/2020 12:59:49                        DORITOS
## 213          MX001 Abarrotes 19/06/2020 22:29:58                       HERSHEYS
## 214          MX001 Abarrotes 19/06/2020 22:29:58                         DANONE
## 215          MX001 Abarrotes 19/06/2020 22:34:47                        RUFFLES
## 216          MX001 Abarrotes 19/06/2020 22:34:47                    RANCHERITOS
## 217          MX001 Abarrotes 19/06/2020 22:34:47 CHICHARRON DE CERDO (SABRITAS)
## 218          MX001 Abarrotes 19/06/2020 22:36:09                  MANZANITA SOL
## 219          MX001 Abarrotes 19/06/2020 22:36:36                        CHEETOS
## 220          MX001 Abarrotes 19/06/2020 13:02:51                          PEPSI
## 221          MX001 Abarrotes 19/06/2020 22:36:55                        CHEETOS
## 222          MX001 Abarrotes 19/06/2020 22:36:55                      COCA COLA
## 223          MX001 Abarrotes 19/06/2020 13:03:41                          PEPSI
## 224          MX001 Abarrotes 19/06/2020 22:36:55                       BIG COLA
## 225          MX001 Abarrotes 19/06/2020 13:03:59                     CAMPBELL'S
## 226          MX001 Abarrotes 19/06/2020 22:37:35                        TIX TIX
## 227          MX001 Abarrotes 19/06/2020 13:04:52                          PEPSI
## 228          MX001 Abarrotes 19/06/2020 22:44:03                           LINK
## 229          MX001 Abarrotes 19/06/2020 13:10:16                           JOYA
## 230          MX001 Abarrotes 19/06/2020 22:51:55                      COCA COLA
## 231          MX001 Abarrotes 19/06/2020 13:10:34                      COCA COLA
## 232          MX001 Abarrotes 19/06/2020 13:13:37                      COCA COLA
## 233          MX001 Abarrotes 19/06/2020 13:13:37                       MARINELA
## 234          MX001 Abarrotes 19/06/2020 13:13:37                          PEPSI
## 235          MX001 Abarrotes 19/06/2020 23:02:00                          PICOT
## 236          MX001 Abarrotes 19/06/2020 23:02:31                     SABRITONES
## 237          MX001 Abarrotes 19/06/2020 23:02:31                    PAPIRRINGAS
## 238          MX001 Abarrotes 19/06/2020 23:02:31                       PAKETAXO
## 239          MX001 Abarrotes 19/06/2020 13:17:21                          PEPSI
## 240          MX001 Abarrotes 19/06/2020 13:18:08     BLANCA NIEVES (DETERGENTE)
## 241          MX001 Abarrotes 19/06/2020 13:18:08                       SUAVITEL
## 242          MX001 Abarrotes 19/06/2020 23:07:22                          BIMBO
## 243          MX001 Abarrotes 19/06/2020 13:21:38                       CLORALEX
## 244          MX001 Abarrotes 19/06/2020 23:08:25                      PAPATINAS
## 245          MX001 Abarrotes 19/06/2020 23:08:45                         NESTLE
## 246          MX001 Abarrotes 19/06/2020 13:26:15                          PEPSI
## 247          MX001 Abarrotes 19/06/2020 23:14:00                      DEL VALLE
## 248          MX001 Abarrotes 19/06/2020 23:14:00                        MIRINDA
## 249          MX001 Abarrotes 19/06/2020 23:17:46                       MARLBORO
## 250          MX001 Abarrotes 19/06/2020 23:19:05                           LALA
## 251          MX001 Abarrotes 19/06/2020 23:19:19                          PEPSI
## 252          MX001 Abarrotes 19/06/2020 23:23:26                         MONELI
## 253          MX001 Abarrotes 19/06/2020 23:31:35                      COCA COLA
## 254          MX001 Abarrotes 19/06/2020 23:31:35                           LALA
## 255          MX001 Abarrotes 19/06/2020 13:34:57                       DANONINO
## 256          MX001 Abarrotes 19/06/2020 23:31:35                         NEVADA
## 257          MX001 Abarrotes 19/06/2020 23:32:25                        CHEETOS
## 258          MX001 Abarrotes 19/06/2020 13:38:34                       CLORALEX
## 259          MX001 Abarrotes 19/06/2020 13:39:01                      COCA COLA
## 260          MX001 Abarrotes 19/06/2020 23:35:11                          PEPSI
## 261          MX001 Abarrotes 19/06/2020 23:35:56                BENSON & HEDGES
## 262          MX001 Abarrotes 19/06/2020 13:39:30                            ACE
## 263          MX001 Abarrotes 19/06/2020 23:35:56                       SABRITAS
## 264          MX001 Abarrotes 19/06/2020 13:39:30                       CLORALEX
## 265          MX001 Abarrotes 19/06/2020 23:35:56                        BOKADOS
## 266          MX001 Abarrotes 19/06/2020 13:39:30                       SUAVITEL
## 267          MX001 Abarrotes 19/06/2020 23:40:21                         FRUTSI
## 268          MX001 Abarrotes 19/06/2020 23:40:21                        CHEETOS
## 269          MX001 Abarrotes 19/06/2020 13:39:52                      COCA COLA
## 270          MX001 Abarrotes 19/06/2020 13:39:52                       CRUJITOS
## 271          MX001 Abarrotes 19/06/2020 23:40:21                   BUBBA XTREME
## 272          MX001 Abarrotes 19/06/2020 13:40:30                      COCA COLA
## 273          MX001 Abarrotes 19/06/2020 13:41:52                        KINDER 
## 274          MX001 Abarrotes 19/06/2020 23:47:45                       POWERADE
## 275          MX001 Abarrotes 19/06/2020 23:47:45                           RAID
## 276          MX001 Abarrotes 19/06/2020 13:43:18                      DEL VALLE
## 277          MX001 Abarrotes 19/06/2020 13:43:18                        RUFFLES
## 278          MX001 Abarrotes 19/06/2020 13:46:45                        YOPLAIT
## 279          MX001 Abarrotes 19/06/2020 13:46:45                        YOPLAIT
## 280          MX001 Abarrotes 19/06/2020 13:46:45                       MARINELA
## 281          MX001 Abarrotes 19/06/2020 23:52:17                           LALA
## 282          MX001 Abarrotes 19/06/2020 23:52:17                          BIMBO
## 283          MX001 Abarrotes 19/06/2020 13:49:04                       CLORALEX
## 284          MX001 Abarrotes 19/06/2020 23:52:17                       SABRITAS
## 285          MX001 Abarrotes 19/06/2020 23:52:17                       MARLBORO
## 286          MX001 Abarrotes 19/06/2020 23:52:40                          BIMBO
## 287          MX001 Abarrotes 19/06/2020 13:52:51                      COCA COLA
## 288          MX001 Abarrotes 19/06/2020 23:58:22                       POWERADE
## 289          MX001 Abarrotes 19/06/2020 23:59:37                           LALA
## 290          MX001 Abarrotes 20/06/2020 00:01:17                    SUAVELASTIC
## 291          MX001 Abarrotes 20/06/2020 00:01:41                          PEPSI
## 292          MX001 Abarrotes 19/06/2020 14:07:27                          EPURA
## 293          MX001 Abarrotes 20/06/2020 00:01:59                        CHEETOS
## 294          MX001 Abarrotes 19/06/2020 14:09:20                          PEPSI
## 295          MX001 Abarrotes 20/06/2020 00:02:36                        DORITOS
## 296          MX001 Abarrotes 20/06/2020 00:02:36                        DORITOS
## 297          MX001 Abarrotes 20/06/2020 00:02:36                          PEPSI
## 298          MX001 Abarrotes 20/06/2020 00:03:27                VELADORA MEXICO
## 299          MX001 Abarrotes 20/06/2020 00:04:30                       CLORALEX
## 300          MX001 Abarrotes 20/06/2020 00:04:30                          AXION
## 301          MX001 Abarrotes 20/06/2020 00:06:38                     VALLE FRUT
## 302          MX001 Abarrotes 20/06/2020 00:07:29                          BIMBO
## 303          MX001 Abarrotes 20/06/2020 00:07:29                       MARINELA
## 304          MX001 Abarrotes 19/06/2020 14:17:33                        CHEETOS
## 305          MX001 Abarrotes 19/06/2020 14:17:48                          PINOL
## 306          MX001 Abarrotes 20/06/2020 00:09:25                       MARLBORO
## 307          MX001 Abarrotes 19/06/2020 14:20:01                        MIRINDA
## 308          MX001 Abarrotes 20/06/2020 00:12:57                          PEPSI
## 309          MX001 Abarrotes 20/06/2020 00:14:20                       MARLBORO
## 310          MX001 Abarrotes 20/06/2020 00:14:20                           JOYA
## 311          MX001 Abarrotes 19/06/2020 14:25:17                      COCA COLA
## 312          MX001 Abarrotes 19/06/2020 14:28:20                         SQUIRT
## 313          MX001 Abarrotes 19/06/2020 14:28:40                        DORITOS
## 314          MX001 Abarrotes 20/06/2020 09:00:08                           LALA
## 315          MX001 Abarrotes 20/06/2020 09:00:08                        MIRINDA
## 316          MX001 Abarrotes 19/06/2020 14:29:05                        CHEETOS
## 317          MX001 Abarrotes 19/06/2020 14:29:17                        CHEETOS
## 318          MX001 Abarrotes 20/06/2020 09:12:46                          PEPSI
## 319          MX001 Abarrotes 20/06/2020 09:13:08                          BIMBO
## 320          MX001 Abarrotes 20/06/2020 09:13:08                          PEPSI
## 321          MX001 Abarrotes 20/06/2020 09:18:58                       MARINELA
## 322          MX001 Abarrotes 20/06/2020 09:18:58                          BIMBO
## 323          MX001 Abarrotes 20/06/2020 09:21:05     BLANCA NIEVES (DETERGENTE)
## 324          MX001 Abarrotes 20/06/2020 09:21:05                          BIMBO
## 325          MX001 Abarrotes 20/06/2020 09:21:05                      COCA COLA
## 326          MX001 Abarrotes 20/06/2020 09:22:15                      COCA COLA
## 327          MX001 Abarrotes 20/06/2020 09:24:05                          PEPSI
## 328          MX001 Abarrotes 20/06/2020 09:24:05                           LINK
## 329          MX001 Abarrotes 19/06/2020 14:40:07                        DORITOS
## 330          MX001 Abarrotes 19/06/2020 14:40:07                        CHEETOS
## 331          MX001 Abarrotes 19/06/2020 14:40:07                       SABRITAS
## 332          MX001 Abarrotes 20/06/2020 09:31:45                           LALA
## 333          MX001 Abarrotes 20/06/2020 09:31:45                       POWERADE
## 334          MX001 Abarrotes 20/06/2020 09:33:04                          PEPSI
## 335          MX001 Abarrotes 20/06/2020 09:33:04                          PEPSI
## 336          MX001 Abarrotes 19/06/2020 14:40:48                          PEPSI
## 337          MX001 Abarrotes 20/06/2020 09:33:27                          PEPSI
## 338          MX001 Abarrotes 20/06/2020 09:37:32                         DAN UP
## 339          MX001 Abarrotes 19/06/2020 14:45:19                       SABRITAS
## 340          MX001 Abarrotes 19/06/2020 14:45:19                        CHEETOS
## 341          MX001 Abarrotes 20/06/2020 09:49:29                           LALA
## 342          MX001 Abarrotes 19/06/2020 14:46:20                       SABRITAS
## 343          MX001 Abarrotes 20/06/2020 09:49:29                          PEPSI
## 344          MX001 Abarrotes 20/06/2020 09:54:03                       PRINGLES
## 345          MX001 Abarrotes 20/06/2020 10:05:19                       MARINELA
## 346          MX001 Abarrotes 20/06/2020 10:05:19                          BIMBO
## 347          MX001 Abarrotes 19/06/2020 14:48:09                          PEPSI
## 348          MX001 Abarrotes 19/06/2020 14:49:02                        ENCANTO
## 349          MX001 Abarrotes 19/06/2020 14:49:02                      COCA COLA
## 350          MX001 Abarrotes 19/06/2020 14:49:02                       MARINELA
## 351          MX001 Abarrotes 19/06/2020 14:49:02                     VALLE FRUT
## 352          MX001 Abarrotes 19/06/2020 14:49:54                     VALLE FRUT
## 353          MX001 Abarrotes 19/06/2020 14:53:48                      COCA COLA
## 354          MX001 Abarrotes 20/06/2020 10:49:23                        MIRINDA
## 355          MX001 Abarrotes 20/06/2020 11:02:16     BLANCA NIEVES (DETERGENTE)
## 356          MX001 Abarrotes 19/06/2020 14:55:34                        CHEETOS
## 357          MX001 Abarrotes 20/06/2020 11:02:16                          PEPSI
## 358          MX001 Abarrotes 20/06/2020 11:02:16                       FABULOSO
## 359          MX001 Abarrotes 19/06/2020 14:56:04                        BOKADOS
## 360          MX001 Abarrotes 19/06/2020 14:56:04                        BOKADOS
## 361          MX001 Abarrotes 19/06/2020 14:56:17                      COCA COLA
## 362          MX001 Abarrotes 20/06/2020 11:07:42                          PEPSI
## 363          MX001 Abarrotes 19/06/2020 14:57:23                      COCA COLA
## 364          MX001 Abarrotes 20/06/2020 11:09:48                      COCA COLA
## 365          MX001 Abarrotes 19/06/2020 15:00:11                          PEPSI
## 366          MX001 Abarrotes 19/06/2020 15:02:36                      COCA COLA
## 367          MX001 Abarrotes 19/06/2020 15:02:36                          SALVO
## 368          MX001 Abarrotes 20/06/2020 11:25:23                        ISADORA
## 369          MX001 Abarrotes 19/06/2020 15:02:59                       CLORALEX
## 370          MX001 Abarrotes 19/06/2020 15:02:59                          PINOL
## 371          MX001 Abarrotes 20/06/2020 11:26:02                          PEPSI
## 372          MX001 Abarrotes 20/06/2020 11:26:02                         NEVADA
## 373          MX001 Abarrotes 19/06/2020 15:06:30                          BIMBO
## 374          MX001 Abarrotes 20/06/2020 11:32:38                          PEPSI
## 375          MX001 Abarrotes 19/06/2020 15:06:30                      COCA COLA
## 376          MX001 Abarrotes 19/06/2020 15:08:22                          JUMEX
## 377          MX001 Abarrotes 20/06/2020 11:33:16                          PEPSI
## 378          MX001 Abarrotes 19/06/2020 15:08:55                      COCA COLA
## 379          MX001 Abarrotes 19/06/2020 15:10:20                      COCA COLA
## 380          MX001 Abarrotes 19/06/2020 15:12:47                           LALA
## 381          MX001 Abarrotes 20/06/2020 11:38:52              1-2-3 (ABARROTES)
## 382          MX001 Abarrotes 20/06/2020 11:38:52                          SALVO
## 383          MX001 Abarrotes 20/06/2020 11:41:05                          JUMEX
## 384          MX001 Abarrotes 20/06/2020 11:41:05                      DEL VALLE
## 385          MX001 Abarrotes 19/06/2020 15:15:13                     TOPO CHICO
## 386          MX001 Abarrotes 19/06/2020 15:16:17                          BIMBO
## 387          MX001 Abarrotes 20/06/2020 11:42:43                       DANONINO
## 388          MX001 Abarrotes 19/06/2020 15:19:15                        RUFFLES
## 389          MX001 Abarrotes 19/06/2020 15:19:15                        DORITOS
## 390          MX001 Abarrotes 19/06/2020 15:19:15                          PEPSI
## 391          MX001 Abarrotes 20/06/2020 11:53:56                      COCA COLA
## 392          MX001 Abarrotes 19/06/2020 15:23:38                          PEPSI
## 393          MX001 Abarrotes 20/06/2020 11:55:14                          PEPSI
## 394          MX001 Abarrotes 20/06/2020 11:55:39                          PEPSI
## 395          MX001 Abarrotes 19/06/2020 15:24:31                          PEPSI
## 396          MX001 Abarrotes 19/06/2020 16:32:54                          PEPSI
## 397          MX001 Abarrotes 20/06/2020 12:00:13                          PEPSI
## 398          MX001 Abarrotes 19/06/2020 16:33:38                        CHEETOS
## 399          MX001 Abarrotes 20/06/2020 12:01:22                          PINOL
## 400          MX001 Abarrotes 19/06/2020 16:35:27                        RUFFLES
## 401          MX001 Abarrotes 19/06/2020 16:35:27     BLANCA NIEVES (DETERGENTE)
## 402          MX001 Abarrotes 19/06/2020 16:35:27                      COCA COLA
## 403          MX001 Abarrotes 20/06/2020 12:02:53                      COCA COLA
## 404          MX001 Abarrotes 20/06/2020 12:02:53                           LALA
## 405          MX001 Abarrotes 19/06/2020 16:39:39                        ENCANTO
## 406          MX001 Abarrotes 19/06/2020 16:39:39                          JUMEX
## 407          MX001 Abarrotes 19/06/2020 16:39:54                      NATURELLA
## 408          MX001 Abarrotes 20/06/2020 12:05:46                       TOSTITOS
## 409          MX001 Abarrotes 20/06/2020 12:05:46                        DORITOS
## 410          MX001 Abarrotes 20/06/2020 12:05:46                        CHEETOS
## 411          MX001 Abarrotes 20/06/2020 12:05:46                       CRUJITOS
## 412          MX001 Abarrotes 20/06/2020 12:05:46                          PEPSI
## 413          MX001 Abarrotes 20/06/2020 12:05:46                    RANCHERITOS
## 414          MX001 Abarrotes 20/06/2020 12:05:46                     VALLE FRUT
## 415          MX001 Abarrotes 19/06/2020 16:41:20                           TANG
## 416          MX001 Abarrotes 20/06/2020 12:08:41                        FRUTZZO
## 417          MX001 Abarrotes 20/06/2020 12:08:41                           LINK
## 418          MX001 Abarrotes 20/06/2020 12:08:41                      CONVERMEX
## 419          MX001 Abarrotes 20/06/2020 12:09:56                        MAIZENA
## 420          MX001 Abarrotes 19/06/2020 16:51:57                    PAPIRRINGAS
## 421          MX001 Abarrotes 19/06/2020 16:55:37                      CABALLITO
## 422          MX001 Abarrotes 19/06/2020 16:55:37                      CABALLITO
## 423          MX001 Abarrotes 20/06/2020 12:13:39                       CLORALEX
## 424          MX001 Abarrotes 20/06/2020 12:13:39                          BIMBO
## 425          MX001 Abarrotes 20/06/2020 12:13:39                      COCA COLA
## 426          MX001 Abarrotes 19/06/2020 17:03:40                           TANG
## 427          MX001 Abarrotes 19/06/2020 17:03:40                           TANG
## 428          MX001 Abarrotes 19/06/2020 17:05:42                      COCA COLA
## 429          MX001 Abarrotes 19/06/2020 17:09:08                       SABRITAS
## 430          MX001 Abarrotes 20/06/2020 12:24:24                     HELLMANN´S
## 431          MX001 Abarrotes 19/06/2020 17:10:14                          PEPSI
## 432          MX001 Abarrotes 19/06/2020 17:10:31                           JOYA
## 433          MX001 Abarrotes 20/06/2020 12:24:54                      COCA COLA
## 434          MX001 Abarrotes 20/06/2020 12:25:18                          PEPSI
## 435          MX001 Abarrotes 20/06/2020 12:29:04                      COCA COLA
## 436          MX001 Abarrotes 19/06/2020 17:16:35                      COCA COLA
## 437          MX001 Abarrotes 19/06/2020 17:16:35                           TANG
## 438          MX001 Abarrotes 20/06/2020 13:05:44                       POWERADE
## 439          MX001 Abarrotes 20/06/2020 13:06:41                  TOPITOS (BK2)
## 440          MX001 Abarrotes 20/06/2020 13:12:18                          FLASH
## 441          MX001 Abarrotes 19/06/2020 17:23:48                          BIMBO
## 442          MX001 Abarrotes 20/06/2020 13:13:56                      COCA COLA
## 443          MX001 Abarrotes 20/06/2020 13:14:48                          BIMBO
## 444          MX001 Abarrotes 20/06/2020 13:14:48                          PEPSI
## 445          MX001 Abarrotes 19/06/2020 17:25:06                      DEL VALLE
## 446          MX001 Abarrotes 19/06/2020 17:26:53                          PEPSI
## 447          MX001 Abarrotes 20/06/2020 13:18:01                            LEO
## 448          MX001 Abarrotes 20/06/2020 13:18:01                      COCA COLA
## 449          MX001 Abarrotes 20/06/2020 13:18:01                          BIMBO
## 450          MX001 Abarrotes 20/06/2020 13:18:01                    RANCHERITOS
## 451          MX001 Abarrotes 19/06/2020 17:27:50                    PERMA SHARP
## 452          MX001 Abarrotes 19/06/2020 17:28:16                          PEPSI
## 453          MX001 Abarrotes 20/06/2020 13:29:02                          PEPSI
## 454          MX001 Abarrotes 19/06/2020 17:33:54                           JOYA
## 455          MX001 Abarrotes 20/06/2020 13:30:20                          FANTA
## 456          MX001 Abarrotes 20/06/2020 13:31:19                       DIAMANTE
## 457          MX001 Abarrotes 20/06/2020 13:31:52                        MAIZENA
## 458          MX001 Abarrotes 19/06/2020 17:36:58                        KINDER 
## 459          MX001 Abarrotes 20/06/2020 13:33:34                       POWERADE
## 460          MX001 Abarrotes 19/06/2020 17:37:18                           ROMA
## 461          MX001 Abarrotes 20/06/2020 13:33:34                          BIMBO
## 462          MX001 Abarrotes 19/06/2020 17:37:18                           ZOTE
## 463          MX001 Abarrotes 20/06/2020 13:36:33                      COCA COLA
## 464          MX001 Abarrotes 20/06/2020 13:38:50                     VALLE FRUT
## 465          MX001 Abarrotes 19/06/2020 17:44:38                       MARINELA
## 466          MX001 Abarrotes 19/06/2020 17:44:38                      COCA COLA
## 467          MX001 Abarrotes 20/06/2020 13:40:14                     VALLE FRUT
## 468          MX001 Abarrotes 19/06/2020 17:45:07                       SEVEN UP
## 469          MX001 Abarrotes 19/06/2020 17:45:07                          PEPSI
## 470          MX001 Abarrotes 19/06/2020 17:45:55                           TANG
## 471          MX001 Abarrotes 20/06/2020 13:53:16                  MANZANITA SOL
## 472          MX001 Abarrotes 19/06/2020 17:45:55                           TANG
## 473          MX001 Abarrotes 20/06/2020 13:54:01                          BIMBO
## 474          MX001 Abarrotes 19/06/2020 17:55:14                          PEPSI
## 475          MX001 Abarrotes 19/06/2020 17:56:34                      DEL VALLE
## 476          MX001 Abarrotes 19/06/2020 17:57:32                         NEVADA
## 477          MX001 Abarrotes 19/06/2020 17:58:07                        RUFFLES
## 478          MX001 Abarrotes 20/06/2020 14:10:49                     TOPO CHICO
## 479          MX001 Abarrotes 19/06/2020 18:05:01                          PEPSI
## 480          MX001 Abarrotes 19/06/2020 18:05:56                          PEPSI
## 481          MX001 Abarrotes 20/06/2020 14:26:32                          BIMBO
## 482          MX001 Abarrotes 20/06/2020 14:26:32                       CRUJITOS
## 483          MX001 Abarrotes 19/06/2020 18:06:47                         SQUIRT
## 484          MX001 Abarrotes 19/06/2020 18:07:42                          PEPSI
## 485          MX001 Abarrotes 20/06/2020 14:28:40                         MASECA
## 486          MX001 Abarrotes 20/06/2020 14:28:40                           INCA
## 487          MX001 Abarrotes 20/06/2020 14:29:11             SALADITAS (GAMESA)
## 488          MX001 Abarrotes 20/06/2020 14:29:11                  MANZANITA SOL
## 489          MX001 Abarrotes 19/06/2020 18:09:38                         GAMESA
## 490          MX001 Abarrotes 19/06/2020 18:09:38             SALADITAS (GAMESA)
## 491          MX001 Abarrotes 19/06/2020 18:09:38                           ROMA
## 492          MX001 Abarrotes 20/06/2020 14:52:41                          HUNTS
## 493          MX001 Abarrotes 20/06/2020 14:52:41             SALADITAS (GAMESA)
## 494          MX001 Abarrotes 19/06/2020 18:10:05                       TOSTITOS
## 495          MX001 Abarrotes 20/06/2020 14:52:41                        TIX TIX
## 496          MX001 Abarrotes 20/06/2020 14:52:41                          PEPSI
## 497          MX001 Abarrotes 20/06/2020 14:52:41                     DEL FUERTE
## 498          MX001 Abarrotes 19/06/2020 18:10:20                          PEPSI
## 499          MX001 Abarrotes 20/06/2020 15:18:25                          PEPSI
## 500          MX001 Abarrotes 20/06/2020 15:21:00                       CLORALEX
## 501          MX001 Abarrotes 20/06/2020 15:21:00                          PINOL
## 502          MX001 Abarrotes 20/06/2020 15:21:00                       BIG COLA
## 503          MX001 Abarrotes 19/06/2020 18:12:21                          PEPSI
## 504          MX001 Abarrotes 20/06/2020 15:23:13                          PEPSI
## 505          MX001 Abarrotes 20/06/2020 15:23:31                         FRESCA
## 506          MX001 Abarrotes 20/06/2020 15:26:14                       SEVEN UP
## 507          MX001 Abarrotes 19/06/2020 18:20:03                      COCA COLA
## 508          MX001 Abarrotes 20/06/2020 15:27:17                         TECATE
## 509          MX001 Abarrotes 20/06/2020 15:27:17                       MARLBORO
## 510          MX001 Abarrotes 20/06/2020 15:28:25                      COCA COLA
## 511          MX001 Abarrotes 20/06/2020 15:28:25                          PEPSI
## 512          MX001 Abarrotes 19/06/2020 18:22:15                        KINDER 
## 513          MX001 Abarrotes 19/06/2020 18:22:39                       FABULOSO
## 514          MX001 Abarrotes 19/06/2020 18:22:39                          SALVO
## 515          MX001 Abarrotes 20/06/2020 15:28:56                      COCA COLA
## 516          MX001 Abarrotes 20/06/2020 15:30:54                          FLASH
## 517          MX001 Abarrotes 19/06/2020 18:23:32                     LA VILLITA
## 518          MX001 Abarrotes 20/06/2020 15:30:54                       CLORALEX
## 519          MX001 Abarrotes 20/06/2020 15:30:54                          FLASH
## 520          MX001 Abarrotes 19/06/2020 18:23:32                          PEPSI
## 521          MX001 Abarrotes 19/06/2020 18:25:27                       SABRITAS
## 522          MX001 Abarrotes 19/06/2020 18:25:27                          BIMBO
## 523          MX001 Abarrotes 20/06/2020 15:31:21                          PEPSI
## 524          MX001 Abarrotes 19/06/2020 18:25:27                        MIRINDA
## 525          MX001 Abarrotes 19/06/2020 18:25:27                     BLUE HOUSE
## 526          MX001 Abarrotes 20/06/2020 15:31:39                          PEPSI
## 527          MX001 Abarrotes 19/06/2020 18:27:49                          PEPSI
## 528          MX001 Abarrotes 20/06/2020 15:33:27                        CHEETOS
## 529          MX001 Abarrotes 19/06/2020 18:32:10                        CHEETOS
## 530          MX001 Abarrotes 20/06/2020 15:33:27                          PEPSI
## 531          MX001 Abarrotes 20/06/2020 15:34:03               GARNIER NUTRISSE
## 532          MX001 Abarrotes 19/06/2020 18:36:02                           TANG
## 533          MX001 Abarrotes 20/06/2020 15:51:39                       MARLBORO
## 534          MX001 Abarrotes 19/06/2020 18:43:54                          PEPSI
## 535          MX001 Abarrotes 20/06/2020 15:51:39                      COCA COLA
## 536          MX001 Abarrotes 19/06/2020 18:47:32                          PEPSI
## 537          MX001 Abarrotes 19/06/2020 18:50:45                          PEPSI
## 538          MX001 Abarrotes 20/06/2020 15:55:02                      COCA COLA
## 539          MX001 Abarrotes 20/06/2020 15:57:05                     VALLE FRUT
## 540          MX001 Abarrotes 20/06/2020 15:58:56                          PEPSI
## 541          MX001 Abarrotes 19/06/2020 18:57:02                          PEPSI
## 542          MX001 Abarrotes 20/06/2020 16:00:54                       POWERADE
## 543          MX001 Abarrotes 20/06/2020 16:01:18                          PEPSI
## 544          MX001 Abarrotes 19/06/2020 18:59:37                          PEPSI
## 545          MX001 Abarrotes 20/06/2020 16:05:51                          PEPSI
## 546          MX001 Abarrotes 19/06/2020 19:00:45                           TANG
## 547          MX001 Abarrotes 19/06/2020 19:02:40                          PEPSI
## 548          MX001 Abarrotes 20/06/2020 16:20:58                        DORITOS
## 549          MX001 Abarrotes 20/06/2020 16:20:58                          PEPSI
## 550          MX001 Abarrotes 20/06/2020 16:20:58                       JARRITOS
## 551          MX001 Abarrotes 19/06/2020 19:03:01                      COCA COLA
## 552          MX001 Abarrotes 20/06/2020 16:20:58                       JARRITOS
## 553          MX001 Abarrotes 20/06/2020 16:28:13                      PALL MALL
## 554          MX001 Abarrotes 20/06/2020 16:43:11                      EL DORADO
## 555          MX001 Abarrotes 19/06/2020 19:06:40                          PEPSI
## 556          MX001 Abarrotes 19/06/2020 19:07:21                       TOSTILEO
## 557          MX001 Abarrotes 19/06/2020 19:07:21              EMPERADOR (SENZO)
## 558          MX001 Abarrotes 19/06/2020 19:07:21                          BIMBO
## 559          MX001 Abarrotes 20/06/2020 17:49:07                         FRITOS
## 560          MX001 Abarrotes 20/06/2020 17:49:07                        DORITOS
## 561          MX001 Abarrotes 20/06/2020 17:49:07                         TECATE
## 562          MX001 Abarrotes 19/06/2020 19:09:17                          PEPSI
## 563          MX001 Abarrotes 20/06/2020 18:07:03                     LA COSTEÑA
## 564          MX001 Abarrotes 19/06/2020 19:10:03                      COCA COLA
## 565          MX001 Abarrotes 19/06/2020 19:10:57                         DANONE
## 566          MX001 Abarrotes 20/06/2020 18:07:29                  MANZANITA SOL
## 567          MX001 Abarrotes 19/06/2020 19:10:57                       DANONINO
## 568          MX001 Abarrotes 19/06/2020 19:11:50                       PAKETAXO
## 569          MX001 Abarrotes 19/06/2020 19:15:13                       POWERADE
## 570          MX001 Abarrotes 20/06/2020 18:35:33           MAZAPAN AZTECA (BK2)
## 571          MX001 Abarrotes 20/06/2020 18:35:33                        TIX TIX
## 572          MX001 Abarrotes 19/06/2020 19:17:38                         NORVER
## 573          MX001 Abarrotes 20/06/2020 18:47:11                         FRUTSI
## 574          MX001 Abarrotes 19/06/2020 19:20:01                           LALA
## 575          MX001 Abarrotes 19/06/2020 19:20:01                      NORTEÑITA
## 576          MX001 Abarrotes 19/06/2020 19:21:03                          BOING
## 577          MX001 Abarrotes 19/06/2020 19:21:03                      COCA COLA
## 578          MX001 Abarrotes 20/06/2020 18:55:37                      COCA COLA
## 579          MX001 Abarrotes 19/06/2020 19:21:03                            M&M
## 580          MX001 Abarrotes 19/06/2020 19:21:39                         SPRITE
## 581          MX001 Abarrotes 19/06/2020 19:23:44                           LALA
## 582          MX001 Abarrotes 19/06/2020 19:23:44                        CRISTAL
## 583          MX001 Abarrotes 20/06/2020 19:12:44                     SABRITONES
## 584          MX001 Abarrotes 20/06/2020 19:12:44                        POFFETS
## 585          MX001 Abarrotes 20/06/2020 19:12:44                        CHEETOS
## 586          MX001 Abarrotes 19/06/2020 19:24:53                          BIMBO
## 587          MX001 Abarrotes 20/06/2020 19:12:44                       MARINELA
## 588          MX001 Abarrotes 19/06/2020 19:24:53                      COCA COLA
## 589          MX001 Abarrotes 20/06/2020 19:15:38                       GILLETTE
## 590          MX001 Abarrotes 20/06/2020 19:15:38                    PERMA SHARP
## 591          MX001 Abarrotes 19/06/2020 19:26:35                      COCA COLA
## 592          MX001 Abarrotes 19/06/2020 19:26:35                     VALLE FRUT
## 593          MX001 Abarrotes 19/06/2020 19:32:10                        CHEETOS
## 594          MX001 Abarrotes 19/06/2020 19:32:10                        CHEETOS
## 595          MX001 Abarrotes 19/06/2020 19:32:55                          PEPSI
## 596          MX001 Abarrotes 19/06/2020 19:33:17             SALADITAS (GAMESA)
## 597          MX001 Abarrotes 19/06/2020 19:33:17                           LALA
## 598          MX001 Abarrotes 19/06/2020 19:33:17                          PEPSI
## 599          MX001 Abarrotes 19/06/2020 19:33:41                      COCA COLA
## 600          MX001 Abarrotes 20/06/2020 20:19:33                          EPURA
## 601          MX001 Abarrotes 19/06/2020 19:34:43                      COCA COLA
## 602          MX001 Abarrotes 20/06/2020 20:47:05                           LALA
## 603          MX001 Abarrotes 20/06/2020 20:47:05                          PEPSI
## 604          MX001 Abarrotes 20/06/2020 20:54:42                      CONVERMEX
## 605          MX001 Abarrotes 20/06/2020 20:56:25                        NESCAFE
## 606          MX001 Abarrotes 20/06/2020 20:56:25                          BIMBO
## 607          MX001 Abarrotes 20/06/2020 21:01:40             CHEESE PUFFS (LEO)
## 608          MX001 Abarrotes 20/06/2020 21:02:29                    NUTRI LECHE
## 609          MX001 Abarrotes 20/06/2020 21:02:29                           ZOTE
## 610          MX001 Abarrotes 20/06/2020 21:02:29                        PREMIER
## 611          MX001 Abarrotes 20/06/2020 21:02:29                       COLGATE 
## 612          MX001 Abarrotes 20/06/2020 21:02:29                       COLGATE 
## 613          MX001 Abarrotes 20/06/2020 21:04:02                    SPEED STICK
## 614          MX001 Abarrotes 20/06/2020 21:04:02                       COLGATE 
## 615          MX001 Abarrotes 20/06/2020 21:16:59                        MORELOS
## 616          MX001 Abarrotes 20/06/2020 21:16:59                        BOKADOS
## 617          MX001 Abarrotes 20/06/2020 21:16:59                        BOKADOS
## 618          MX001 Abarrotes 20/06/2020 21:23:30                  MANZANITA SOL
## 619          MX001 Abarrotes 20/06/2020 21:24:41                     LA COSTEÑA
## 620          MX001 Abarrotes 19/06/2020 19:54:03                          PEPSI
## 621          MX001 Abarrotes 19/06/2020 19:54:39             SALADITAS (GAMESA)
## 622          MX001 Abarrotes 20/06/2020 21:27:09                      COCA COLA
## 623          MX001 Abarrotes 20/06/2020 21:42:10                           LALA
## 624          MX001 Abarrotes 19/06/2020 19:56:12                          PEPSI
## 625          MX001 Abarrotes 20/06/2020 21:45:28                           TANG
## 626          MX001 Abarrotes 20/06/2020 21:45:28                           ZUKO
## 627          MX001 Abarrotes 20/06/2020 21:47:17                        MORELOS
## 628          MX001 Abarrotes 19/06/2020 19:57:03                          PEPSI
## 629          MX001 Abarrotes 20/06/2020 21:50:27                       MARLBORO
## 630          MX001 Abarrotes 19/06/2020 19:57:44                        CLAMATO
## 631          MX001 Abarrotes 19/06/2020 20:00:14                       PAKETAXO
## 632          MX001 Abarrotes 19/06/2020 20:00:14                       PAKETAXO
## 633          MX001 Abarrotes 20/06/2020 21:55:35                          BIMBO
## 634          MX001 Abarrotes 19/06/2020 20:05:04                        CHEETOS
## 635          MX001 Abarrotes 20/06/2020 21:58:21                         MASECA
## 636          MX001 Abarrotes 19/06/2020 20:11:36                      COCA COLA
## 637          MX001 Abarrotes 20/06/2020 21:59:23                     DEL FUERTE
## 638          MX001 Abarrotes 20/06/2020 22:11:27                       MARLBORO
## 639          MX001 Abarrotes 19/06/2020 20:17:54                        RUFFLES
## 640          MX001 Abarrotes 20/06/2020 22:12:58                      COCA COLA
## 641          MX001 Abarrotes 19/06/2020 20:21:25                        RUFFLES
## 642          MX001 Abarrotes 20/06/2020 22:22:43                          PEPSI
## 643          MX001 Abarrotes 20/06/2020 22:24:46                      COCA COLA
## 644          MX001 Abarrotes 20/06/2020 22:27:07                        CLAMATO
## 645          MX001 Abarrotes 19/06/2020 20:23:21                          PEPSI
## 646          MX001 Abarrotes 20/06/2020 22:29:31                          PEPSI
## 647          MX001 Abarrotes 20/06/2020 22:29:31                      CONVERMEX
## 648          MX001 Abarrotes 19/06/2020 20:23:55                       GATORADE
## 649          MX001 Abarrotes 19/06/2020 20:23:55                       SABRITAS
## 650          MX001 Abarrotes 20/06/2020 22:30:13                      COCA COLA
## 651          MX001 Abarrotes 19/06/2020 20:26:27                      COCA COLA
## 652          MX001 Abarrotes 19/06/2020 20:28:29                          PEPSI
## 653          MX001 Abarrotes 19/06/2020 20:30:53                      COCA COLA
## 654          MX001 Abarrotes 20/06/2020 22:41:52                          PEPSI
## 655          MX001 Abarrotes 19/06/2020 20:32:37                          KNORR
## 656          MX001 Abarrotes 19/06/2020 20:32:37                          KNORR
## 657          MX001 Abarrotes 19/06/2020 20:32:37                          KNORR
## 658          MX001 Abarrotes 20/06/2020 22:50:24                       MARLBORO
## 659          MX001 Abarrotes 20/06/2020 22:50:42                         MASECA
## 660          MX001 Abarrotes 19/06/2020 20:34:12                      COCA COLA
## 661          MX001 Abarrotes 19/06/2020 20:34:28                      COCA COLA
## 662          MX001 Abarrotes 20/06/2020 22:53:04                          JUMEX
## 663          MX001 Abarrotes 19/06/2020 20:34:48                      COCA COLA
## 664          MX001 Abarrotes 19/06/2020 20:34:48                      COCA COLA
## 665          MX001 Abarrotes 20/06/2020 22:55:15                      COCA COLA
## 666          MX001 Abarrotes 19/06/2020 20:36:21                          BIMBO
## 667          MX001 Abarrotes 19/06/2020 20:36:21                    LA BOTANERA
## 668          MX001 Abarrotes 19/06/2020 20:36:21                          BIMBO
## 669          MX001 Abarrotes 20/06/2020 22:55:35                         SQUIRT
## 670          MX001 Abarrotes 19/06/2020 20:37:34                          PEPSI
## 671          MX001 Abarrotes 20/06/2020 22:56:19                         SQUIRT
## 672          MX001 Abarrotes 20/06/2020 22:57:20                          TAJIN
## 673          MX001 Abarrotes 20/06/2020 22:57:20                     TOPO CHICO
## 674          MX001 Abarrotes 19/06/2020 20:37:56                          PEPSI
## 675          MX001 Abarrotes 20/06/2020 22:57:20                         FRESCA
## 676          MX001 Abarrotes 20/06/2020 22:57:20                         SPRITE
## 677          MX001 Abarrotes 19/06/2020 20:42:22                          PEPSI
## 678          MX001 Abarrotes 19/06/2020 20:42:22                           LINK
## 679          MX001 Abarrotes 20/06/2020 23:06:25                      COCA COLA
## 680          MX001 Abarrotes 19/06/2020 20:42:50                    DE LA VIUDA
## 681          MX001 Abarrotes 20/06/2020 23:09:35                      COCA COLA
## 682          MX001 Abarrotes 19/06/2020 20:43:04                      COCA COLA
## 683          MX001 Abarrotes 20/06/2020 23:10:28                       LA ANITA
## 684          MX001 Abarrotes 20/06/2020 23:10:28                      DEL HOGAR
## 685          MX001 Abarrotes 20/06/2020 23:13:42                      NATURELLA
## 686          MX001 Abarrotes 19/06/2020 20:44:56                           JOYA
## 687          MX001 Abarrotes 19/06/2020 20:44:56                      COCA COLA
## 688          MX001 Abarrotes 19/06/2020 20:45:22                          PEPSI
## 689          MX001 Abarrotes 20/06/2020 23:26:48                     EL JIMADOR
## 690          MX001 Abarrotes 20/06/2020 23:26:48                         FRESCA
## 691          MX001 Abarrotes 19/06/2020 20:47:57                      COCA COLA
## 692          MX001 Abarrotes 19/06/2020 20:47:57                       SABRITAS
## 693          MX001 Abarrotes 20/06/2020 23:30:17                      COCA COLA
## 694          MX001 Abarrotes 19/06/2020 20:49:56                           INCA
## 695          MX001 Abarrotes 19/06/2020 20:50:34                    PERMA SHARP
## 696          MX001 Abarrotes 20/06/2020 23:47:51                           ZUKO
## 697          MX001 Abarrotes 19/06/2020 20:50:57                          JUMEX
## 698          MX001 Abarrotes 19/06/2020 20:50:57                          PEPSI
## 699          MX001 Abarrotes 19/06/2020 20:54:44                     VALLE FRUT
## 700          MX001 Abarrotes 20/06/2020 23:53:05                        BOKADOS
## 701          MX001 Abarrotes 20/06/2020 23:53:05                        BOKADOS
## 702          MX001 Abarrotes 20/06/2020 23:53:05                           LALA
## 703          MX001 Abarrotes 20/06/2020 23:53:05                       CRUJITOS
## 704          MX001 Abarrotes 19/06/2020 20:55:18                           LINK
## 705          MX001 Abarrotes 20/06/2020 23:55:01                           LALA
## 706          MX001 Abarrotes 20/06/2020 23:55:01                  VARIOS DANONE
## 707          MX001 Abarrotes 20/06/2020 23:55:01                         DANONE
## 708          MX001 Abarrotes 20/06/2020 23:55:01                       MARLBORO
## 709          MX001 Abarrotes 20/06/2020 23:55:39                        CAMELIA
## 710          MX001 Abarrotes 20/06/2020 23:55:39                       MARLBORO
## 711          MX001 Abarrotes 21/06/2020 00:03:39           MAZAPAN AZTECA (BK2)
## 712          MX001 Abarrotes 19/06/2020 21:00:40                        KINDER 
## 713          MX001 Abarrotes 21/06/2020 00:07:45                           LINK
## 714          MX001 Abarrotes 21/06/2020 00:08:20                      PALL MALL
## 715          MX001 Abarrotes 21/06/2020 00:12:21                       MARINELA
## 716          MX001 Abarrotes 21/06/2020 00:12:50                     TOPO CHICO
## 717          MX001 Abarrotes 19/06/2020 21:10:16                          BIMBO
## 718          MX001 Abarrotes 19/06/2020 21:10:16                           LALA
## 719          MX001 Abarrotes 21/06/2020 00:13:58                           VOLT
## 720          MX001 Abarrotes 21/06/2020 00:14:45                      DEL VALLE
## 721          MX001 Abarrotes 21/06/2020 00:15:20                       TOSTITOS
## 722          MX001 Abarrotes 21/06/2020 00:15:20                        CHEETOS
## 723          MX001 Abarrotes 19/06/2020 21:12:47                         SQUIRT
## 724          MX001 Abarrotes 21/06/2020 00:21:32                VELADORA MEXICO
## 725          MX001 Abarrotes 21/06/2020 00:21:32                      COCA COLA
## 726          MX001 Abarrotes 21/06/2020 00:21:32                     CHURRUMAIS
## 727          MX001 Abarrotes 21/06/2020 00:21:32                         NEVADA
## 728          MX001 Abarrotes 19/06/2020 21:18:05                         DANONE
## 729          MX001 Abarrotes 19/06/2020 21:18:48                      COCA COLA
## 730          MX001 Abarrotes 21/06/2020 00:35:08                        BOKADOS
## 731          MX001 Abarrotes 21/06/2020 00:35:08                        RUFFLES
## 732          MX001 Abarrotes 19/06/2020 21:20:56                        KINDER 
## 733          MX001 Abarrotes 19/06/2020 21:21:11                      COCA COLA
## 734          MX001 Abarrotes 19/06/2020 21:22:16                          BIMBO
## 735          MX001 Abarrotes 21/06/2020 00:40:25                          PEPSI
## 736          MX001 Abarrotes 19/06/2020 21:22:35                      COCA COLA
## 737          MX001 Abarrotes 19/06/2020 21:23:17                           TANG
## 738          MX001 Abarrotes 19/06/2020 21:23:17                  MANZANITA SOL
## 739          MX001 Abarrotes 19/06/2020 21:23:38                           LALA
## 740          MX001 Abarrotes 19/06/2020 21:23:38                            FUD
## 741          MX001 Abarrotes 21/06/2020 00:49:04                       PAKETAXO
## 742          MX001 Abarrotes 21/06/2020 00:49:04                       SABRITAS
## 743          MX001 Abarrotes 21/06/2020 00:49:04                          PEPSI
## 744          MX001 Abarrotes 21/06/2020 00:49:04                       POWERADE
## 745          MX001 Abarrotes 19/06/2020 21:27:29                           JOYA
## 746          MX001 Abarrotes 21/06/2020 00:49:04                     VALLE FRUT
## 747          MX001 Abarrotes 21/06/2020 00:49:48                        RUFFLES
## 748          MX001 Abarrotes 19/06/2020 21:29:32                        RUFFLES
## 749          MX001 Abarrotes 21/06/2020 00:49:48                       POWERADE
## 750          MX001 Abarrotes 21/06/2020 00:50:34                       MARLBORO
## 751          MX001 Abarrotes 21/06/2020 00:50:54                       PRINGLES
## 752          MX001 Abarrotes 19/06/2020 21:31:54                      COCA COLA
## 753          MX001 Abarrotes 19/06/2020 21:32:56                           NIDO
## 754          MX001 Abarrotes 19/06/2020 21:32:56                       DIAMANTE
## 755          MX001 Abarrotes 21/06/2020 00:52:29                       POWERADE
## 756          MX001 Abarrotes 19/06/2020 21:36:55                    DE LA VIUDA
## 757          MX001 Abarrotes 19/06/2020 21:38:00                           LALA
## 758          MX001 Abarrotes 19/06/2020 21:38:00                      COCA COLA
## 759          MX001 Abarrotes 21/06/2020 01:02:08                       MARLBORO
## 760          MX001 Abarrotes 21/06/2020 01:03:37                         MONELI
## 761          MX001 Abarrotes 21/06/2020 01:05:33                          ELITE
## 762          MX001 Abarrotes 19/06/2020 21:47:00                       POWERADE
## 763          MX001 Abarrotes 19/06/2020 21:49:45                          PEPSI
## 764          MX001 Abarrotes 19/06/2020 21:50:35                      CONVERMEX
## 765          MX001 Abarrotes 19/06/2020 21:52:15                         GAMESA
## 766          MX001 Abarrotes 21/06/2020 01:37:41                       TOSTITOS
## 767          MX001 Abarrotes 19/06/2020 21:55:10                      COCA COLA
## 768          MX001 Abarrotes 19/06/2020 21:55:10                        DORITOS
## 769          MX001 Abarrotes 19/06/2020 21:55:10                    PERMA SHARP
## 770          MX001 Abarrotes 21/06/2020 01:38:57                       MARLBORO
## 771          MX001 Abarrotes 21/06/2020 01:42:02                       PAKETAXO
## 772          MX001 Abarrotes 21/06/2020 01:42:02                      COCA COLA
## 773          MX001 Abarrotes 21/06/2020 01:42:02                          PINOL
## 774          MX001 Abarrotes 19/06/2020 21:58:07              EMPERADOR (SENZO)
## 775          MX001 Abarrotes 19/06/2020 21:58:07             SALADITAS (GAMESA)
## 776          MX001 Abarrotes 19/06/2020 21:58:07                           LALA
## 777          MX001 Abarrotes 21/06/2020 01:53:15                  MANZANITA SOL
## 778          MX001 Abarrotes 21/06/2020 01:53:15                          PULPY
## 779          MX001 Abarrotes 19/06/2020 22:02:39                          PEPSI
## 780          MX001 Abarrotes 19/06/2020 22:03:29                           INCA
## 781          MX001 Abarrotes 19/06/2020 22:04:01                 TRES ESTRELLAS
## 782          MX001 Abarrotes 21/06/2020 08:44:05                          BIMBO
## 783          MX001 Abarrotes 19/06/2020 22:04:52                           LALA
## 784          MX001 Abarrotes 21/06/2020 09:14:27                       MARINELA
## 785          MX001 Abarrotes 19/06/2020 22:12:37                       NUTRIOLI
## 786          MX001 Abarrotes 21/06/2020 09:21:27                           LALA
## 787          MX001 Abarrotes 21/06/2020 09:21:40                      COCA COLA
## 788          MX001 Abarrotes 19/06/2020 22:15:52                           LALA
## 789          MX001 Abarrotes 19/06/2020 22:16:16                        KINDER 
## 790          MX001 Abarrotes 21/06/2020 09:23:04                      COCA COLA
## 791          MX001 Abarrotes 19/06/2020 22:16:57                         ALWAYS
## 792          MX001 Abarrotes 21/06/2020 09:23:44                          FANTA
## 793          MX001 Abarrotes 21/06/2020 09:23:44                          EPURA
## 794          MX001 Abarrotes 21/06/2020 09:26:25                           LALA
## 795          MX001 Abarrotes 21/06/2020 09:26:25                          BIMBO
## 796          MX001 Abarrotes 19/06/2020 22:17:34                          BIMBO
## 797          MX001 Abarrotes 21/06/2020 09:28:32                           JOYA
## 798          MX001 Abarrotes 21/06/2020 09:30:11                      COCA COLA
## 799          MX001 Abarrotes 19/06/2020 22:22:39                           BIDA
## 800          MX001 Abarrotes 21/06/2020 09:34:13                         NEVADA
## 801          MX001 Abarrotes 21/06/2020 09:35:02                      COCA COLA
## 802          MX001 Abarrotes 21/06/2020 09:35:02                        KINDER 
## 803          MX001 Abarrotes 19/06/2020 22:25:32                         NEVADA
## 804          MX001 Abarrotes 21/06/2020 10:07:35                          PEPSI
## 805          MX001 Abarrotes 19/06/2020 22:29:00                           BIDA
## 806          MX001 Abarrotes 19/06/2020 22:29:00                           BIDA
## 807          MX001 Abarrotes 19/06/2020 22:31:06                         FRESCA
## 808          MX001 Abarrotes 19/06/2020 22:38:23                       TOSTITOS
## 809          MX001 Abarrotes 19/06/2020 22:40:59              EMPERADOR (SENZO)
## 810          MX001 Abarrotes 21/06/2020 10:31:38                        FRUTZZO
## 811          MX001 Abarrotes 19/06/2020 22:42:07                          PEPSI
## 812          MX001 Abarrotes 19/06/2020 22:42:07                       SEVEN UP
## 813          MX001 Abarrotes 21/06/2020 10:33:23                          PEPSI
## 814          MX001 Abarrotes 21/06/2020 10:35:46                          PEPSI
## 815          MX001 Abarrotes 19/06/2020 22:46:03                          BIMBO
## 816          MX001 Abarrotes 21/06/2020 10:41:31                        ISADORA
## 817          MX001 Abarrotes 21/06/2020 10:45:58                      COCA COLA
## 818          MX001 Abarrotes 19/06/2020 22:49:31                          PEPSI
## 819          MX001 Abarrotes 21/06/2020 10:58:35                     DOÑA MARIA
## 820          MX001 Abarrotes 19/06/2020 22:51:53                       CRUJITOS
## 821          MX001 Abarrotes 19/06/2020 22:54:17                        CHEETOS
## 822          MX001 Abarrotes 21/06/2020 10:59:17                      COCA COLA
## 823          MX001 Abarrotes 19/06/2020 22:55:34                       MARINELA
## 824          MX001 Abarrotes 19/06/2020 22:55:34                          PEPSI
## 825          MX001 Abarrotes 19/06/2020 22:56:08                       HOT NUTS
## 826          MX001 Abarrotes 21/06/2020 11:01:05                          PEPSI
## 827          MX001 Abarrotes 19/06/2020 22:56:58                        BOKADOS
## 828          MX001 Abarrotes 21/06/2020 12:35:56                           LALA
## 829          MX001 Abarrotes 21/06/2020 12:35:56                          PEPSI
## 830          MX001 Abarrotes 21/06/2020 12:35:56               CARNATION CLAVEL
## 831          MX001 Abarrotes 19/06/2020 23:01:31                       MARINELA
## 832          MX001 Abarrotes 21/06/2020 12:39:04                           BIDA
## 833          MX001 Abarrotes 21/06/2020 12:39:04                      COCA COLA
## 834          MX001 Abarrotes 21/06/2020 12:39:04                      DEL MONTE
## 835          MX001 Abarrotes 19/06/2020 23:01:31                      HABANERAS
## 836          MX001 Abarrotes 21/06/2020 12:41:25                           JOYA
## 837          MX001 Abarrotes 19/06/2020 23:07:12                      COCA COLA
## 838          MX001 Abarrotes 19/06/2020 23:07:12                          BIMBO
## 839          MX001 Abarrotes 19/06/2020 23:07:12                           LALA
## 840          MX001 Abarrotes 21/06/2020 12:42:06                            EGO
## 841          MX001 Abarrotes 19/06/2020 23:07:46                           LALA
## 842          MX001 Abarrotes 19/06/2020 23:07:46                          BIMBO
## 843          MX001 Abarrotes 19/06/2020 23:07:46                     VALLE FRUT
## 844          MX001 Abarrotes 21/06/2020 12:43:25                          PEPSI
## 845          MX001 Abarrotes 21/06/2020 12:43:25                          EPURA
## 846          MX001 Abarrotes 21/06/2020 12:45:46                    MEDIA CREMA
## 847          MX001 Abarrotes 19/06/2020 23:10:51                        RUFFLES
## 848          MX001 Abarrotes 19/06/2020 23:10:51                          PULPY
## 849          MX001 Abarrotes 21/06/2020 12:45:46                          SALVO
## 850          MX001 Abarrotes 21/06/2020 12:47:21                       SABRITAS
## 851          MX001 Abarrotes 21/06/2020 12:47:21                          PEPSI
## 852          MX001 Abarrotes 21/06/2020 12:48:14                           LALA
## 853          MX001 Abarrotes 21/06/2020 12:48:14                          BIMBO
## 854          MX001 Abarrotes 21/06/2020 12:48:14                           LARA
## 855          MX001 Abarrotes 21/06/2020 12:48:14                       MARINELA
## 856          MX001 Abarrotes 19/06/2020 23:13:17                    NUTRI LECHE
## 857          MX001 Abarrotes 21/06/2020 12:49:58                      CONSOMATE
## 858          MX001 Abarrotes 21/06/2020 12:50:53                     TOPO CHICO
## 859          MX001 Abarrotes 19/06/2020 23:17:15                           BIDA
## 860          MX001 Abarrotes 19/06/2020 23:17:15                          PEPSI
## 861          MX001 Abarrotes 21/06/2020 12:54:47                         FRUTSI
## 862          MX001 Abarrotes 19/06/2020 23:18:57                       MARINELA
## 863          MX001 Abarrotes 19/06/2020 23:18:57                          BIMBO
## 864          MX001 Abarrotes 21/06/2020 12:55:38                          PEPSI
## 865          MX001 Abarrotes 21/06/2020 12:56:05                          BIMBO
## 866          MX001 Abarrotes 21/06/2020 12:56:05                           LARA
## 867          MX001 Abarrotes 19/06/2020 23:19:35                          PEPSI
## 868          MX001 Abarrotes 21/06/2020 12:56:05                    NUTRI LECHE
## 869          MX001 Abarrotes 21/06/2020 13:00:45                        DORITOS
## 870          MX001 Abarrotes 21/06/2020 13:00:45                          PEPSI
## 871          MX001 Abarrotes 19/06/2020 23:25:24                        KINDER 
## 872          MX001 Abarrotes 21/06/2020 13:01:00                          PEPSI
## 873          MX001 Abarrotes 21/06/2020 13:01:35                     TOPO CHICO
## 874          MX001 Abarrotes 21/06/2020 13:01:54                      COCA COLA
## 875          MX001 Abarrotes 21/06/2020 13:02:16                          PEPSI
## 876          MX001 Abarrotes 19/06/2020 23:28:58                          PEPSI
## 877          MX001 Abarrotes 19/06/2020 23:30:11                      COCA COLA
## 878          MX001 Abarrotes 19/06/2020 23:30:11                COCA COLA LIGHT
## 879          MX001 Abarrotes 19/06/2020 23:36:18                    NUTRI LECHE
## 880          MX001 Abarrotes 19/06/2020 23:36:18                         DANONE
## 881          MX001 Abarrotes 19/06/2020 23:36:18                      COCA COLA
## 882          MX001 Abarrotes 21/06/2020 13:07:18                      COCA COLA
## 883          MX001 Abarrotes 19/06/2020 23:40:15                        DORITOS
## 884          MX001 Abarrotes 19/06/2020 23:48:58                       MARLBORO
## 885          MX001 Abarrotes 19/06/2020 23:48:58                          PEPSI
## 886          MX001 Abarrotes 19/06/2020 23:57:01                          PEPSI
## 887          MX001 Abarrotes 20/06/2020 00:08:28                        RUFFLES
## 888          MX001 Abarrotes 21/06/2020 13:22:28                      COCA COLA
## 889          MX001 Abarrotes 21/06/2020 13:25:25                CREMAX DE NIEVE
## 890          MX001 Abarrotes 21/06/2020 13:25:25                    NUTRI LECHE
## 891          MX001 Abarrotes 20/06/2020 00:12:40                          PEPSI
## 892          MX001 Abarrotes 21/06/2020 13:32:00                          PEPSI
## 893          MX001 Abarrotes 20/06/2020 00:13:59                        CLAMATO
## 894          MX001 Abarrotes 20/06/2020 00:18:11                      COCA COLA
## 895          MX001 Abarrotes 20/06/2020 00:18:11                        RUFFLES
## 896          MX001 Abarrotes 21/06/2020 13:34:35                           LARA
## 897          MX001 Abarrotes 20/06/2020 00:21:01                           LALA
## 898          MX001 Abarrotes 21/06/2020 13:34:35              DELICIOSAS (LARA)
## 899          MX001 Abarrotes 20/06/2020 00:28:00                         TECATE
## 900          MX001 Abarrotes 21/06/2020 13:38:48                           JOYA
## 901          MX001 Abarrotes 21/06/2020 13:40:21                       COLGATE 
## 902          MX001 Abarrotes 21/06/2020 13:47:27                          BIMBO
## 903          MX001 Abarrotes 21/06/2020 13:48:04                       FABULOSO
## 904          MX001 Abarrotes 21/06/2020 13:49:56                           ZOTE
## 905          MX001 Abarrotes 20/06/2020 08:36:34                     LA COSTEÑA
## 906          MX001 Abarrotes 21/06/2020 13:49:56                      DEL MONTE
## 907          MX001 Abarrotes 21/06/2020 13:53:49                          PEPSI
## 908          MX001 Abarrotes 21/06/2020 13:56:32                      DEL MONTE
## 909          MX001 Abarrotes 20/06/2020 08:43:52                      LA SIERRA
## 910          MX001 Abarrotes 21/06/2020 13:56:32                         NORVER
## 911          MX001 Abarrotes 21/06/2020 13:56:32                       KARTAMUS
## 912          MX001 Abarrotes 21/06/2020 13:58:50                         FRUTSI
## 913          MX001 Abarrotes 20/06/2020 08:48:07                      COCA COLA
## 914          MX001 Abarrotes 21/06/2020 13:58:50                       PAKETAXO
## 915          MX001 Abarrotes 21/06/2020 14:29:57                          PEPSI
## 916          MX001 Abarrotes 20/06/2020 09:00:00                       MARIPOSA
## 917          MX001 Abarrotes 21/06/2020 14:30:29                  VARIOS DANONE
## 918          MX001 Abarrotes 21/06/2020 14:30:29                         DANONE
## 919          MX001 Abarrotes 20/06/2020 09:00:00                           ROMA
## 920          MX001 Abarrotes 20/06/2020 09:00:00                           ZOTE
## 921          MX001 Abarrotes 20/06/2020 09:00:00                           JOYA
## 922          MX001 Abarrotes 20/06/2020 09:17:00                          BIMBO
## 923          MX001 Abarrotes 20/06/2020 09:17:00                          PEPSI
## 924          MX001 Abarrotes 21/06/2020 14:33:05                          PEPSI
## 925          MX001 Abarrotes 20/06/2020 09:41:49                          BIMBO
## 926          MX001 Abarrotes 20/06/2020 09:41:49                          BIMBO
## 927          MX001 Abarrotes 20/06/2020 09:43:06                           LALA
## 928          MX001 Abarrotes 21/06/2020 14:36:54                           LALA
## 929          MX001 Abarrotes 20/06/2020 09:46:20                          PEPSI
## 930          MX001 Abarrotes 20/06/2020 09:53:34                          JUMEX
## 931          MX001 Abarrotes 20/06/2020 09:53:34                        LA FINA
## 932          MX001 Abarrotes 21/06/2020 14:37:49                       POWERADE
## 933          MX001 Abarrotes 21/06/2020 14:41:41                           FOCA
## 934          MX001 Abarrotes 20/06/2020 09:54:28                    NUTRI LECHE
## 935          MX001 Abarrotes 21/06/2020 14:44:56                       POWERADE
## 936          MX001 Abarrotes 20/06/2020 09:54:28                         NEVADA
## 937          MX001 Abarrotes 21/06/2020 14:45:18                       TOSTITOS
## 938          MX001 Abarrotes 21/06/2020 14:48:50                     LA COSTEÑA
## 939          MX001 Abarrotes 21/06/2020 14:48:50                      CONVERMEX
## 940          MX001 Abarrotes 20/06/2020 10:04:20                       TIA ROSA
## 941          MX001 Abarrotes 20/06/2020 10:04:20                          FLAMA
## 942          MX001 Abarrotes 20/06/2020 10:05:02                          BIMBO
## 943          MX001 Abarrotes 21/06/2020 14:54:48                          PEPSI
## 944          MX001 Abarrotes 21/06/2020 14:54:48                          BIMBO
## 945          MX001 Abarrotes 20/06/2020 10:09:00                      DEL HOGAR
## 946          MX001 Abarrotes 20/06/2020 10:09:00                         CHIMEX
## 947          MX001 Abarrotes 20/06/2020 10:09:00                      COCA COLA
## 948          MX001 Abarrotes 20/06/2020 10:09:24                      COCA COLA
## 949          MX001 Abarrotes 21/06/2020 15:01:02                       CLORALEX
## 950          MX001 Abarrotes 20/06/2020 10:10:05                        MONARCA
## 951          MX001 Abarrotes 21/06/2020 16:00:48                          BIMBO
## 952          MX001 Abarrotes 21/06/2020 16:03:30                        RUFFLES
## 953          MX001 Abarrotes 20/06/2020 10:17:24                           LINK
## 954          MX001 Abarrotes 20/06/2020 10:17:24                        ISADORA
## 955          MX001 Abarrotes 21/06/2020 16:05:39                       GATORADE
## 956          MX001 Abarrotes 21/06/2020 16:05:39                         FRUTSI
## 957          MX001 Abarrotes 21/06/2020 16:05:39                     VALLE FRUT
## 958          MX001 Abarrotes 21/06/2020 16:06:35                        CHEETOS
## 959          MX001 Abarrotes 20/06/2020 10:25:15                           LINK
## 960          MX001 Abarrotes 21/06/2020 16:07:33                        CLAMATO
## 961          MX001 Abarrotes 21/06/2020 16:07:33                EL GALLO DE ORO
## 962          MX001 Abarrotes 20/06/2020 10:29:42                      COCA COLA
## 963          MX001 Abarrotes 21/06/2020 16:08:39                        CHEETOS
## 964          MX001 Abarrotes 20/06/2020 10:29:42                       MARINELA
## 965          MX001 Abarrotes 21/06/2020 16:08:39                       GATORADE
## 966          MX001 Abarrotes 21/06/2020 16:08:39                       GATORADE
## 967          MX001 Abarrotes 20/06/2020 10:30:09                      BUBU LUBU
## 968          MX001 Abarrotes 20/06/2020 10:30:09                          PEPSI
## 969          MX001 Abarrotes 21/06/2020 16:09:53                      COCA COLA
## 970          MX001 Abarrotes 20/06/2020 10:31:36                     VALLE FRUT
## 971          MX001 Abarrotes 21/06/2020 16:10:32                           LINK
## 972          MX001 Abarrotes 21/06/2020 16:10:32                          PEPSI
## 973          MX001 Abarrotes 20/06/2020 10:31:36                      COCA COLA
## 974          MX001 Abarrotes 20/06/2020 10:33:28                       MARINELA
## 975          MX001 Abarrotes 20/06/2020 10:37:56                          PEPSI
## 976          MX001 Abarrotes 21/06/2020 16:12:12                      NORTEÑITA
## 977          MX001 Abarrotes 20/06/2020 10:42:22                      COCA COLA
## 978          MX001 Abarrotes 21/06/2020 16:13:11                       SABRITAS
## 979          MX001 Abarrotes 20/06/2020 10:50:09                      COCA COLA
## 980          MX001 Abarrotes 21/06/2020 16:15:14                          PEPSI
## 981          MX001 Abarrotes 21/06/2020 16:16:00                     HELLMANN´S
## 982          MX001 Abarrotes 21/06/2020 16:16:00                          BIMBO
## 983          MX001 Abarrotes 21/06/2020 16:17:06                          PEPSI
## 984          MX001 Abarrotes 20/06/2020 10:59:14                    NUTRI LECHE
## 985          MX001 Abarrotes 20/06/2020 10:59:50                      COCA COLA
## 986          MX001 Abarrotes 21/06/2020 16:17:25                      COCA COLA
## 987          MX001 Abarrotes 21/06/2020 16:18:30                        POFFETS
## 988          MX001 Abarrotes 20/06/2020 11:00:49                          PEPSI
## 989          MX001 Abarrotes 20/06/2020 11:01:02                          PEPSI
## 990          MX001 Abarrotes 21/06/2020 16:19:05                           LINK
## 991          MX001 Abarrotes 20/06/2020 11:07:45                       HERSHEYS
## 992          MX001 Abarrotes 21/06/2020 16:20:39                          PEPSI
## 993          MX001 Abarrotes 21/06/2020 16:20:39                      DEL VALLE
## 994          MX001 Abarrotes 21/06/2020 16:20:39                        ISADORA
## 995          MX001 Abarrotes 20/06/2020 11:09:43                          PEPSI
## 996          MX001 Abarrotes 20/06/2020 11:10:39                          EPURA
## 997          MX001 Abarrotes 20/06/2020 11:11:57                       GATORADE
## 998          MX001 Abarrotes 21/06/2020 16:23:34                      COCA COLA
## 999          MX001 Abarrotes 21/06/2020 16:23:34                          BIMBO
## 1000         MX001 Abarrotes 21/06/2020 16:25:19                       JARRITOS
## 1001         MX001 Abarrotes 21/06/2020 16:26:01                      COCA COLA
## 1002         MX001 Abarrotes 21/06/2020 16:26:01                       SEVEN UP
## 1003         MX001 Abarrotes 21/06/2020 16:26:54                       POWERADE
## 1004         MX001 Abarrotes 20/06/2020 11:15:51                          PEPSI
## 1005         MX001 Abarrotes 21/06/2020 16:27:57                    RANCH STYLE
## 1006         MX001 Abarrotes 21/06/2020 16:27:57                     LA COSTEÑA
## 1007         MX001 Abarrotes 21/06/2020 16:28:25                      COCA COLA
## 1008         MX001 Abarrotes 21/06/2020 16:28:25                            LEO
## 1009         MX001 Abarrotes 21/06/2020 16:29:01                           ZUKO
## 1010         MX001 Abarrotes 21/06/2020 16:29:11                          BIMBO
## 1011         MX001 Abarrotes 20/06/2020 12:33:13                     HELLMANN´S
## 1012         MX001 Abarrotes 21/06/2020 16:29:11                    FROOT LOOPS
## 1013         MX001 Abarrotes 20/06/2020 12:35:46                      COCA COLA
## 1014         MX001 Abarrotes 20/06/2020 12:37:02                         FRUTSI
## 1015         MX001 Abarrotes 20/06/2020 12:37:02                      DEL VALLE
## 1016         MX001 Abarrotes 20/06/2020 12:37:02                          PEPSI
## 1017         MX001 Abarrotes 21/06/2020 16:30:18                      PALL MALL
## 1018         MX001 Abarrotes 20/06/2020 12:37:31                        CHEETOS
## 1019         MX001 Abarrotes 20/06/2020 12:37:31                          BIMBO
## 1020         MX001 Abarrotes 21/06/2020 16:33:01                         GERBER
## 1021         MX001 Abarrotes 21/06/2020 16:33:01                          JUMEX
## 1022         MX001 Abarrotes 21/06/2020 16:33:01                           JOYA
## 1023         MX001 Abarrotes 21/06/2020 16:34:12                         TECATE
## 1024         MX001 Abarrotes 21/06/2020 16:35:52                          JUMEX
## 1025         MX001 Abarrotes 20/06/2020 12:45:26                          FLASH
## 1026         MX001 Abarrotes 21/06/2020 16:35:52                       JARRITOS
## 1027         MX001 Abarrotes 21/06/2020 16:35:52                         SQUIRT
## 1028         MX001 Abarrotes 20/06/2020 12:46:34                          PEPSI
## 1029         MX001 Abarrotes 21/06/2020 16:37:23                          PEPSI
## 1030         MX001 Abarrotes 21/06/2020 16:37:23                         CHIMEX
## 1031         MX001 Abarrotes 20/06/2020 12:52:00                     DEL FUERTE
## 1032         MX001 Abarrotes 20/06/2020 12:52:00                         NORVER
## 1033         MX001 Abarrotes 20/06/2020 12:53:49                      COCA COLA
## 1034         MX001 Abarrotes 20/06/2020 12:54:09             SALADITAS (GAMESA)
## 1035         MX001 Abarrotes 20/06/2020 12:54:09                      COCA COLA
## 1036         MX001 Abarrotes 21/06/2020 16:39:08                      COCA COLA
## 1037         MX001 Abarrotes 20/06/2020 12:54:43     BLANCA NIEVES (DETERGENTE)
## 1038         MX001 Abarrotes 20/06/2020 12:54:43                            H24
## 1039         MX001 Abarrotes 21/06/2020 16:40:42                      YOP TEENS
## 1040         MX001 Abarrotes 20/06/2020 12:56:11                      COCA COLA
## 1041         MX001 Abarrotes 21/06/2020 16:42:48                COCA COLA LIGHT
## 1042         MX001 Abarrotes 21/06/2020 16:42:48                      COCA COLA
## 1043         MX001 Abarrotes 21/06/2020 16:42:48                      CONVERMEX
## 1044         MX001 Abarrotes 21/06/2020 16:42:48                      CONVERMEX
## 1045         MX001 Abarrotes 20/06/2020 12:57:02                     DEL FUERTE
## 1046         MX001 Abarrotes 20/06/2020 12:57:29                      COCA COLA
## 1047         MX001 Abarrotes 21/06/2020 16:44:09                      COCA COLA
## 1048         MX001 Abarrotes 20/06/2020 12:57:49                         FRUTSI
## 1049         MX001 Abarrotes 20/06/2020 12:57:49                       MARINELA
## 1050         MX001 Abarrotes 21/06/2020 16:45:43                       MARUCHAN
## 1051         MX001 Abarrotes 20/06/2020 13:04:33                           LALA
## 1052         MX001 Abarrotes 21/06/2020 16:46:11                       MARUCHAN
## 1053         MX001 Abarrotes 20/06/2020 13:06:00                       CLORALEX
## 1054         MX001 Abarrotes 20/06/2020 13:06:00                           TANG
## 1055         MX001 Abarrotes 20/06/2020 13:06:53                       POWERADE
## 1056         MX001 Abarrotes 21/06/2020 16:48:10                           TANG
## 1057         MX001 Abarrotes 20/06/2020 13:13:10                      NORTEÑITA
## 1058         MX001 Abarrotes 21/06/2020 16:48:40                       MARUCHAN
## 1059         MX001 Abarrotes 21/06/2020 16:48:40             SALADITAS (GAMESA)
## 1060         MX001 Abarrotes 21/06/2020 16:48:40                      COCA COLA
## 1061         MX001 Abarrotes 21/06/2020 16:49:45                        CHEETOS
## 1062         MX001 Abarrotes 20/06/2020 13:27:25                     VALLE FRUT
## 1063         MX001 Abarrotes 20/06/2020 13:39:32                          BIMBO
## 1064         MX001 Abarrotes 21/06/2020 16:50:08                COCA COLA LIGHT
## 1065         MX001 Abarrotes 21/06/2020 16:50:52                      MCCORMICK
## 1066         MX001 Abarrotes 20/06/2020 13:42:30                      COCA COLA
## 1067         MX001 Abarrotes 20/06/2020 13:49:11                      COCA COLA
## 1068         MX001 Abarrotes 20/06/2020 13:49:51             SALADITAS (GAMESA)
## 1069         MX001 Abarrotes 21/06/2020 16:52:14                          PEPSI
## 1070         MX001 Abarrotes 20/06/2020 13:54:35                      COCA COLA
## 1071         MX001 Abarrotes 20/06/2020 13:54:55                        BOKADOS
## 1072         MX001 Abarrotes 20/06/2020 13:54:55                          BIMBO
## 1073         MX001 Abarrotes 20/06/2020 13:56:12                          PEPSI
## 1074         MX001 Abarrotes 21/06/2020 16:53:43                      COCA COLA
## 1075         MX001 Abarrotes 21/06/2020 16:53:43                           JOYA
## 1076         MX001 Abarrotes 20/06/2020 13:57:55                          EPURA
## 1077         MX001 Abarrotes 21/06/2020 16:56:22                          PEPSI
## 1078         MX001 Abarrotes 21/06/2020 16:57:18                        CLAMATO
## 1079         MX001 Abarrotes 21/06/2020 16:59:47             SALADITAS (GAMESA)
## 1080         MX001 Abarrotes 20/06/2020 14:06:02                      DEL VALLE
## 1081         MX001 Abarrotes 20/06/2020 14:16:23                      COCA COLA
## 1082         MX001 Abarrotes 21/06/2020 17:00:58                      COCA COLA
## 1083         MX001 Abarrotes 20/06/2020 14:17:57                        BOKADOS
## 1084         MX001 Abarrotes 20/06/2020 14:17:57                       SEVEN UP
## 1085         MX001 Abarrotes 20/06/2020 14:17:57                       SAN LUIS
## 1086         MX001 Abarrotes 21/06/2020 17:01:40                       JARRITOS
## 1087         MX001 Abarrotes 20/06/2020 14:22:59                       POWERADE
## 1088         MX001 Abarrotes 21/06/2020 17:04:15                          PULPY
## 1089         MX001 Abarrotes 21/06/2020 17:05:04                      COCA COLA
## 1090         MX001 Abarrotes 21/06/2020 17:07:30                         TECATE
## 1091         MX001 Abarrotes 20/06/2020 14:28:21                        DORITOS
## 1092         MX001 Abarrotes 20/06/2020 14:28:21                       CRUJITOS
## 1093         MX001 Abarrotes 20/06/2020 14:28:21                    RANCHERITOS
## 1094         MX001 Abarrotes 20/06/2020 14:28:37                       SEVEN UP
## 1095         MX001 Abarrotes 21/06/2020 17:11:55                     DEL FUERTE
## 1096         MX001 Abarrotes 20/06/2020 14:29:29                       CLORALEX
## 1097         MX001 Abarrotes 20/06/2020 14:34:58                      COCA COLA
## 1098         MX001 Abarrotes 21/06/2020 17:13:22                      COCA COLA
## 1099         MX001 Abarrotes 21/06/2020 17:13:22                          FANTA
## 1100         MX001 Abarrotes 20/06/2020 14:38:28                       PAKETAXO
## 1101         MX001 Abarrotes 20/06/2020 14:38:28                          PEPSI
## 1102         MX001 Abarrotes 21/06/2020 17:14:42                        BOKADOS
## 1103         MX001 Abarrotes 21/06/2020 17:14:42                        TRIDENT
## 1104         MX001 Abarrotes 21/06/2020 17:16:26                         MASECA
## 1105         MX001 Abarrotes 20/06/2020 14:47:38                     VALLE FRUT
## 1106         MX001 Abarrotes 21/06/2020 17:20:43                        CHEETOS
## 1107         MX001 Abarrotes 20/06/2020 14:51:20                      COCA COLA
## 1108         MX001 Abarrotes 20/06/2020 14:55:15                        CLAMATO
## 1109         MX001 Abarrotes 21/06/2020 17:25:46                  FIOR DI PASTA
## 1110         MX001 Abarrotes 20/06/2020 14:59:47                         GERBER
## 1111         MX001 Abarrotes 21/06/2020 17:25:46              1-2-3 (ABARROTES)
## 1112         MX001 Abarrotes 21/06/2020 17:25:46                          BIMBO
## 1113         MX001 Abarrotes 21/06/2020 17:25:46                      COCA COLA
## 1114         MX001 Abarrotes 20/06/2020 15:00:06                        CHEETOS
## 1115         MX001 Abarrotes 21/06/2020 17:26:25                       MARLBORO
## 1116         MX001 Abarrotes 20/06/2020 15:02:09                      COCA COLA
## 1117         MX001 Abarrotes 20/06/2020 15:02:43                          PEPSI
## 1118         MX001 Abarrotes 21/06/2020 17:28:57                       SEVEN UP
## 1119         MX001 Abarrotes 20/06/2020 15:03:45                       TOSTILEO
## 1120         MX001 Abarrotes 21/06/2020 17:29:53                       POWERADE
## 1121         MX001 Abarrotes 21/06/2020 17:29:53                       PAKETAXO
## 1122         MX001 Abarrotes 21/06/2020 17:29:53                          BIMBO
## 1123         MX001 Abarrotes 21/06/2020 17:29:53                       POWERADE
## 1124         MX001 Abarrotes 21/06/2020 17:30:38                        POFFETS
## 1125         MX001 Abarrotes 21/06/2020 17:30:38                        DORITOS
## 1126         MX001 Abarrotes 21/06/2020 17:30:38                       POWERADE
## 1127         MX001 Abarrotes 21/06/2020 17:33:22                       PAKETAXO
## 1128         MX001 Abarrotes 20/06/2020 15:08:41                          PEPSI
## 1129         MX001 Abarrotes 21/06/2020 17:36:51                        NORTEÑO
## 1130         MX001 Abarrotes 20/06/2020 15:08:41                          EPURA
## 1131         MX001 Abarrotes 20/06/2020 15:12:03                          PEPSI
## 1132         MX001 Abarrotes 21/06/2020 17:37:49                          PEPSI
## 1133         MX001 Abarrotes 21/06/2020 17:39:22                      COCA COLA
## 1134         MX001 Abarrotes 21/06/2020 17:39:51                          PEPSI
## 1135         MX001 Abarrotes 21/06/2020 17:40:35                        CLAMATO
## 1136         MX001 Abarrotes 21/06/2020 17:45:31                          PEPSI
## 1137         MX001 Abarrotes 20/06/2020 15:42:45                          BIMBO
## 1138         MX001 Abarrotes 21/06/2020 17:48:12                        FRUTZZO
## 1139         MX001 Abarrotes 21/06/2020 17:48:12                           INCA
## 1140         MX001 Abarrotes 21/06/2020 17:51:17                    ELECTROPURA
## 1141         MX001 Abarrotes 20/06/2020 15:50:22                      NORTEÑITA
## 1142         MX001 Abarrotes 21/06/2020 17:51:53                  MANZANITA SOL
## 1143         MX001 Abarrotes 20/06/2020 15:52:25     BLANCA NIEVES (DETERGENTE)
## 1144         MX001 Abarrotes 20/06/2020 15:52:25                          PEPSI
## 1145         MX001 Abarrotes 20/06/2020 15:55:13                       MARINELA
## 1146         MX001 Abarrotes 21/06/2020 17:55:17                        CLAMATO
## 1147         MX001 Abarrotes 20/06/2020 16:10:22                       PEDIGREE
## 1148         MX001 Abarrotes 21/06/2020 17:56:25                      CONVERMEX
## 1149         MX001 Abarrotes 20/06/2020 16:10:22                         SPRITE
## 1150         MX001 Abarrotes 21/06/2020 17:56:25                      CONVERMEX
## 1151         MX001 Abarrotes 20/06/2020 16:11:00                        BOKADOS
## 1152         MX001 Abarrotes 21/06/2020 17:57:55                          PICOT
## 1153         MX001 Abarrotes 20/06/2020 16:11:00                      COCA COLA
## 1154         MX001 Abarrotes 21/06/2020 18:11:57                        CLAMATO
## 1155         MX001 Abarrotes 21/06/2020 18:11:57                      CONVERMEX
## 1156         MX001 Abarrotes 21/06/2020 18:11:57                       MARLBORO
## 1157         MX001 Abarrotes 20/06/2020 16:13:41                      EL DORADO
## 1158         MX001 Abarrotes 20/06/2020 16:13:41                      HABANERAS
## 1159         MX001 Abarrotes 20/06/2020 16:16:16                          KRAFT
## 1160         MX001 Abarrotes 21/06/2020 18:14:09                          PEPSI
## 1161         MX001 Abarrotes 21/06/2020 18:17:00                          PEPSI
## 1162         MX001 Abarrotes 21/06/2020 18:17:00                EL GALLO DE ORO
## 1163         MX001 Abarrotes 20/06/2020 16:16:51                      CONVERMEX
## 1164         MX001 Abarrotes 20/06/2020 16:19:10                      COCA COLA
## 1165         MX001 Abarrotes 20/06/2020 16:19:39                            EGO
## 1166         MX001 Abarrotes 20/06/2020 16:20:16                       GATORADE
## 1167         MX001 Abarrotes 20/06/2020 16:21:40                           LINK
## 1168         MX001 Abarrotes 20/06/2020 16:23:09                        CLAMATO
## 1169         MX001 Abarrotes 20/06/2020 16:23:09                      CONVERMEX
## 1170         MX001 Abarrotes 20/06/2020 16:23:31                  MANZANITA SOL
## 1171         MX001 Abarrotes 21/06/2020 18:25:26                         TECATE
## 1172         MX001 Abarrotes 21/06/2020 18:29:27                       SABRITAS
## 1173         MX001 Abarrotes 21/06/2020 18:29:27                        RUFFLES
## 1174         MX001 Abarrotes 21/06/2020 18:29:27                        DORITOS
## 1175         MX001 Abarrotes 20/06/2020 16:28:11                         TECATE
## 1176         MX001 Abarrotes 20/06/2020 16:28:49                          BIMBO
## 1177         MX001 Abarrotes 20/06/2020 16:29:34                          PEPSI
## 1178         MX001 Abarrotes 20/06/2020 16:31:33                       PAKETAXO
## 1179         MX001 Abarrotes 20/06/2020 16:31:33                        DORITOS
## 1180         MX001 Abarrotes 20/06/2020 16:31:33                        CHEETOS
## 1181         MX001 Abarrotes 20/06/2020 16:31:33                       POWERADE
## 1182         MX001 Abarrotes 21/06/2020 18:31:25                      COCA COLA
## 1183         MX001 Abarrotes 20/06/2020 16:35:49                          PEPSI
## 1184         MX001 Abarrotes 21/06/2020 18:36:11                          PEPSI
## 1185         MX001 Abarrotes 20/06/2020 16:36:46                          PEPSI
## 1186         MX001 Abarrotes 21/06/2020 18:42:55                        CHEETOS
## 1187         MX001 Abarrotes 20/06/2020 16:37:51                         TECATE
## 1188         MX001 Abarrotes 20/06/2020 16:38:27                         BOGO´S
## 1189         MX001 Abarrotes 20/06/2020 16:40:30                         BOGO´S
## 1190         MX001 Abarrotes 20/06/2020 16:40:30                         BOGO´S
## 1191         MX001 Abarrotes 20/06/2020 16:42:59             SALADITAS (GAMESA)
## 1192         MX001 Abarrotes 21/06/2020 18:47:00                          PINOL
## 1193         MX001 Abarrotes 21/06/2020 18:47:00                          BIMBO
## 1194         MX001 Abarrotes 21/06/2020 18:47:00                       CLORALEX
## 1195         MX001 Abarrotes 21/06/2020 18:47:00                          FLASH
## 1196         MX001 Abarrotes 21/06/2020 18:47:00                           FOCA
## 1197         MX001 Abarrotes 20/06/2020 16:42:59                          PEPSI
## 1198         MX001 Abarrotes 21/06/2020 18:47:00                       SUAVITEL
## 1199         MX001 Abarrotes 20/06/2020 16:44:31                        CHEETOS
## 1200         MX001 Abarrotes 20/06/2020 16:44:31                      COCA COLA
## 1201         MX001 Abarrotes 21/06/2020 18:48:43                          PEPSI
## 1202         MX001 Abarrotes 20/06/2020 16:48:18                          PEPSI
## 1203         MX001 Abarrotes 20/06/2020 16:49:16                          PEPSI
## 1204         MX001 Abarrotes 21/06/2020 18:51:33                      CONVERMEX
## 1205         MX001 Abarrotes 21/06/2020 18:51:33                      CONVERMEX
## 1206         MX001 Abarrotes 21/06/2020 18:55:36                     VALLE FRUT
## 1207         MX001 Abarrotes 20/06/2020 16:53:44                        RUFFLES
## 1208         MX001 Abarrotes 20/06/2020 16:53:44                          PEPSI
## 1209         MX001 Abarrotes 20/06/2020 16:54:37                          TAJIN
## 1210         MX001 Abarrotes 20/06/2020 16:54:37                      COCA COLA
## 1211         MX001 Abarrotes 20/06/2020 16:55:18                         ACT II
## 1212         MX001 Abarrotes 20/06/2020 16:56:20                       MARUCHAN
## 1213         MX001 Abarrotes 20/06/2020 16:56:20                          PEPSI
## 1214         MX001 Abarrotes 20/06/2020 16:56:20                          LUCAS
## 1215         MX001 Abarrotes 21/06/2020 18:59:56                       MARLBORO
## 1216         MX001 Abarrotes 20/06/2020 16:57:36                    MEDIA CREMA
## 1217         MX001 Abarrotes 20/06/2020 16:57:36             SALADITAS (GAMESA)
## 1218         MX001 Abarrotes 20/06/2020 16:57:36                           TANG
## 1219         MX001 Abarrotes 21/06/2020 19:03:19                        BOKADOS
## 1220         MX001 Abarrotes 20/06/2020 16:58:31                          PICOT
## 1221         MX001 Abarrotes 20/06/2020 16:58:31                           LINK
## 1222         MX001 Abarrotes 21/06/2020 19:46:18                       JARRITOS
## 1223         MX001 Abarrotes 21/06/2020 20:08:02                        RUFFLES
## 1224         MX001 Abarrotes 21/06/2020 20:08:02                        ENSUEÑO
## 1225         MX001 Abarrotes 20/06/2020 17:00:05                      CONSOMATE
## 1226         MX001 Abarrotes 20/06/2020 17:02:11                    PEPSI LIGHT
## 1227         MX001 Abarrotes 21/06/2020 20:10:45               RICOLINO (DULCE)
## 1228         MX001 Abarrotes 20/06/2020 17:02:42                         TECATE
## 1229         MX001 Abarrotes 21/06/2020 20:11:37                          PEPSI
## 1230         MX001 Abarrotes 21/06/2020 20:14:19                LEO CACHAHUATES
## 1231         MX001 Abarrotes 21/06/2020 20:14:19                           LALA
## 1232         MX001 Abarrotes 20/06/2020 17:07:15                COCA COLA LIGHT
## 1233         MX001 Abarrotes 20/06/2020 17:08:33                        DORITOS
## 1234         MX001 Abarrotes 21/06/2020 20:15:40                       BE-LIGHT
## 1235         MX001 Abarrotes 20/06/2020 17:11:09                          PEPSI
## 1236         MX001 Abarrotes 20/06/2020 17:12:13                COCA COLA LIGHT
## 1237         MX001 Abarrotes 21/06/2020 20:20:04                          PEPSI
## 1238         MX001 Abarrotes 20/06/2020 17:13:30                       CRUJITOS
## 1239         MX001 Abarrotes 21/06/2020 20:21:11                      COCA COLA
## 1240         MX001 Abarrotes 20/06/2020 17:14:18                      COCA COLA
## 1241         MX001 Abarrotes 20/06/2020 17:16:17                      COCA COLA
## 1242         MX001 Abarrotes 21/06/2020 20:25:10                      PALL MALL
## 1243         MX001 Abarrotes 20/06/2020 17:16:17                  SIDRAL MUNDET
## 1244         MX001 Abarrotes 21/06/2020 20:25:57                        CHEETOS
## 1245         MX001 Abarrotes 21/06/2020 20:25:57                       MARUCHAN
## 1246         MX001 Abarrotes 21/06/2020 20:25:57                          ELITE
## 1247         MX001 Abarrotes 20/06/2020 17:17:24                       PAKETAXO
## 1248         MX001 Abarrotes 21/06/2020 20:26:30                      COCA COLA
## 1249         MX001 Abarrotes 21/06/2020 20:30:09                        CHEETOS
## 1250         MX001 Abarrotes 20/06/2020 17:18:22                          PEPSI
## 1251         MX001 Abarrotes 20/06/2020 17:18:22                        ENCANTO
## 1252         MX001 Abarrotes 20/06/2020 17:18:22                    5 ESTRELLAS
## 1253         MX001 Abarrotes 21/06/2020 20:32:01                          PEPSI
## 1254         MX001 Abarrotes 20/06/2020 17:18:50                           RAID
## 1255         MX001 Abarrotes 21/06/2020 20:32:01                      COCA COLA
## 1256         MX001 Abarrotes 21/06/2020 20:32:01                     DEL FUERTE
## 1257         MX001 Abarrotes 21/06/2020 20:32:01                      CONVERMEX
## 1258         MX001 Abarrotes 20/06/2020 17:19:29                         ACT II
## 1259         MX001 Abarrotes 21/06/2020 20:33:35                      CONVERMEX
## 1260         MX001 Abarrotes 20/06/2020 17:24:18                          BIMBO
## 1261         MX001 Abarrotes 21/06/2020 20:37:01                      COCA COLA
## 1262         MX001 Abarrotes 21/06/2020 20:37:01                       KOLALOKA
## 1263         MX001 Abarrotes 20/06/2020 17:24:18                         NEVADA
## 1264         MX001 Abarrotes 21/06/2020 20:38:46                           LINK
## 1265         MX001 Abarrotes 21/06/2020 20:42:00                        ENCANTO
## 1266         MX001 Abarrotes 21/06/2020 20:42:00                        BOKADOS
## 1267         MX001 Abarrotes 20/06/2020 17:26:38                       TOSTITOS
## 1268         MX001 Abarrotes 21/06/2020 20:42:00                      CONCHITAS
## 1269         MX001 Abarrotes 21/06/2020 20:42:00                      COCA COLA
## 1270         MX001 Abarrotes 20/06/2020 17:27:13                        ENCANTO
## 1271         MX001 Abarrotes 20/06/2020 17:27:13                    PAPIRRINGAS
## 1272         MX001 Abarrotes 21/06/2020 20:43:38                       JARRITOS
## 1273         MX001 Abarrotes 21/06/2020 20:44:39                       MARUCHAN
## 1274         MX001 Abarrotes 20/06/2020 17:28:22                          PEPSI
## 1275         MX001 Abarrotes 20/06/2020 17:28:40                      COCA COLA
## 1276         MX001 Abarrotes 21/06/2020 20:48:44                       SABRITAS
## 1277         MX001 Abarrotes 21/06/2020 20:50:36                EL GALLO DE ORO
## 1278         MX001 Abarrotes 20/06/2020 17:32:32                      COCA COLA
## 1279         MX001 Abarrotes 20/06/2020 17:32:32                          FANTA
## 1280         MX001 Abarrotes 20/06/2020 17:32:32             TOSTADITAS HIDALGO
## 1281         MX001 Abarrotes 21/06/2020 20:51:24                      NORTEÑITA
## 1282         MX001 Abarrotes 21/06/2020 20:52:01                       MARLBORO
## 1283         MX001 Abarrotes 20/06/2020 17:33:59                          BIMBO
## 1284         MX001 Abarrotes 21/06/2020 20:53:08                           LALA
## 1285         MX001 Abarrotes 20/06/2020 17:34:33                      PALL MALL
## 1286         MX001 Abarrotes 20/06/2020 17:34:58                         ACT II
## 1287         MX001 Abarrotes 21/06/2020 20:54:12                          PEPSI
## 1288         MX001 Abarrotes 20/06/2020 17:35:47                     HELLMANN´S
## 1289         MX001 Abarrotes 21/06/2020 20:54:51                          BIMBO
## 1290         MX001 Abarrotes 21/06/2020 20:54:51                     BLUE HOUSE
## 1291         MX001 Abarrotes 20/06/2020 17:37:18                      COCA COLA
## 1292         MX001 Abarrotes 20/06/2020 17:38:33                         GAMESA
## 1293         MX001 Abarrotes 20/06/2020 17:38:33                    VERDE VALLE
## 1294         MX001 Abarrotes 20/06/2020 17:38:33                      NORTEÑITA
## 1295         MX001 Abarrotes 20/06/2020 17:39:02                      COCA COLA
## 1296         MX001 Abarrotes 20/06/2020 17:40:12                      COCA COLA
## 1297         MX001 Abarrotes 21/06/2020 20:56:53                          PEPSI
## 1298         MX001 Abarrotes 20/06/2020 17:40:12                      COCA COLA
## 1299         MX001 Abarrotes 21/06/2020 20:57:07                    PAPIRRINGAS
## 1300         MX001 Abarrotes 21/06/2020 20:58:20                      COCA COLA
## 1301         MX001 Abarrotes 20/06/2020 17:47:23                          EPURA
## 1302         MX001 Abarrotes 21/06/2020 20:59:28                     TOPO CHICO
## 1303         MX001 Abarrotes 21/06/2020 20:59:28                        CRISTAL
## 1304         MX001 Abarrotes 20/06/2020 17:50:04                       MARUCHAN
## 1305         MX001 Abarrotes 20/06/2020 17:50:35                         ACT II
## 1306         MX001 Abarrotes 21/06/2020 21:01:14                        MIRINDA
## 1307         MX001 Abarrotes 20/06/2020 17:52:39                      COCA COLA
## 1308         MX001 Abarrotes 20/06/2020 17:52:39                         FRESCA
## 1309         MX001 Abarrotes 20/06/2020 17:53:34                          PEPSI
## 1310         MX001 Abarrotes 21/06/2020 21:10:01                          PEPSI
## 1311         MX001 Abarrotes 20/06/2020 17:53:49                      DEL VALLE
## 1312         MX001 Abarrotes 21/06/2020 21:10:51                     TOPO CHICO
## 1313         MX001 Abarrotes 20/06/2020 17:54:49                      VALENTINA
## 1314         MX001 Abarrotes 20/06/2020 17:54:49                       MARINELA
## 1315         MX001 Abarrotes 20/06/2020 17:54:49                       MARUCHAN
## 1316         MX001 Abarrotes 20/06/2020 17:54:49                      COCA COLA
## 1317         MX001 Abarrotes 20/06/2020 17:56:04                       BIG COLA
## 1318         MX001 Abarrotes 21/06/2020 21:12:31                       MARINELA
## 1319         MX001 Abarrotes 20/06/2020 17:58:10                          PEPSI
## 1320         MX001 Abarrotes 20/06/2020 17:58:10                COCA COLA LIGHT
## 1321         MX001 Abarrotes 20/06/2020 18:03:33                           INCA
## 1322         MX001 Abarrotes 21/06/2020 21:15:16                           TANG
## 1323         MX001 Abarrotes 20/06/2020 18:07:46                       MARLBORO
## 1324         MX001 Abarrotes 20/06/2020 18:10:48                       PRINGLES
## 1325         MX001 Abarrotes 20/06/2020 18:10:48                       TOSTILEO
## 1326         MX001 Abarrotes 20/06/2020 18:10:48                       SABRITAS
## 1327         MX001 Abarrotes 20/06/2020 18:11:29                      DEL MONTE
## 1328         MX001 Abarrotes 20/06/2020 18:11:29                    PERMA SHARP
## 1329         MX001 Abarrotes 20/06/2020 18:11:29                         NORVER
## 1330         MX001 Abarrotes 20/06/2020 18:12:41                       MARLBORO
## 1331         MX001 Abarrotes 20/06/2020 18:12:41                        RUFFLES
## 1332         MX001 Abarrotes 20/06/2020 18:12:41                       BONAFONT
## 1333         MX001 Abarrotes 21/06/2020 21:19:13                       PAKETAXO
## 1334         MX001 Abarrotes 20/06/2020 18:13:31                          PEPSI
## 1335         MX001 Abarrotes 20/06/2020 18:13:31                           LINK
## 1336         MX001 Abarrotes 20/06/2020 18:14:07                      COCA COLA
## 1337         MX001 Abarrotes 21/06/2020 21:19:58                       POWERADE
## 1338         MX001 Abarrotes 21/06/2020 21:19:58                          MAMUT
## 1339         MX001 Abarrotes 20/06/2020 18:14:07                           LALA
## 1340         MX001 Abarrotes 20/06/2020 18:14:49             SALADITAS (GAMESA)
## 1341         MX001 Abarrotes 21/06/2020 21:20:57                       MARLBORO
## 1342         MX001 Abarrotes 21/06/2020 21:23:23                          PEPSI
## 1343         MX001 Abarrotes 20/06/2020 18:16:44                          KNORR
## 1344         MX001 Abarrotes 21/06/2020 21:23:41                        DORITOS
## 1345         MX001 Abarrotes 20/06/2020 18:17:16                          PEPSI
## 1346         MX001 Abarrotes 20/06/2020 18:17:36                       GATORADE
## 1347         MX001 Abarrotes 20/06/2020 18:18:14                      CONVERMEX
## 1348         MX001 Abarrotes 20/06/2020 18:18:14                      CONVERMEX
## 1349         MX001 Abarrotes 20/06/2020 18:19:08                      COCA COLA
## 1350         MX001 Abarrotes 21/06/2020 21:27:26                       MARINELA
## 1351         MX001 Abarrotes 20/06/2020 18:19:08                          BIMBO
## 1352         MX001 Abarrotes 20/06/2020 18:19:34                      COCA COLA
## 1353         MX001 Abarrotes 20/06/2020 18:19:34                COCA COLA LIGHT
## 1354         MX001 Abarrotes 21/06/2020 21:28:14                      COCA COLA
## 1355         MX001 Abarrotes 21/06/2020 21:28:44              EMPERADOR (SENZO)
## 1356         MX001 Abarrotes 20/06/2020 18:21:03                       FABULOSO
## 1357         MX001 Abarrotes 20/06/2020 18:21:03                          SALVO
## 1358         MX001 Abarrotes 20/06/2020 18:25:40                           JOYA
## 1359         MX001 Abarrotes 20/06/2020 18:29:18                          PEPSI
## 1360         MX001 Abarrotes 20/06/2020 18:29:35                          PEPSI
## 1361         MX001 Abarrotes 20/06/2020 18:29:56                        CHEETOS
## 1362         MX001 Abarrotes 20/06/2020 18:30:36                           BIDA
## 1363         MX001 Abarrotes 20/06/2020 18:30:58                           ZOTE
## 1364         MX001 Abarrotes 20/06/2020 18:32:02                      COCA COLA
## 1365         MX001 Abarrotes 21/06/2020 21:38:20                       BE-LIGHT
## 1366         MX001 Abarrotes 20/06/2020 18:32:50                          EPURA
## 1367         MX001 Abarrotes 20/06/2020 18:35:23                          PEPSI
## 1368         MX001 Abarrotes 20/06/2020 18:35:23                          BIMBO
## 1369         MX001 Abarrotes 20/06/2020 18:37:25                         FRITOS
## 1370         MX001 Abarrotes 20/06/2020 18:37:25                       SABRITAS
## 1371         MX001 Abarrotes 20/06/2020 18:37:25                          PEPSI
## 1372         MX001 Abarrotes 21/06/2020 21:41:36                           LINK
## 1373         MX001 Abarrotes 20/06/2020 18:40:30                        CLAMATO
## 1374         MX001 Abarrotes 20/06/2020 18:41:01                        RUFFLES
## 1375         MX001 Abarrotes 21/06/2020 21:46:24                      COCA COLA
## 1376         MX001 Abarrotes 20/06/2020 18:46:32                      COCA COLA
## 1377         MX001 Abarrotes 20/06/2020 18:46:32                          BIMBO
## 1378         MX001 Abarrotes 20/06/2020 18:48:13             SALADITAS (GAMESA)
## 1379         MX001 Abarrotes 21/06/2020 21:48:22                        CHEETOS
## 1380         MX001 Abarrotes 20/06/2020 18:48:13                    PEPSI LIGHT
## 1381         MX001 Abarrotes 21/06/2020 21:48:38                        RUFFLES
## 1382         MX001 Abarrotes 20/06/2020 18:48:50                          FLASH
## 1383         MX001 Abarrotes 20/06/2020 18:48:50                          PEPSI
## 1384         MX001 Abarrotes 20/06/2020 18:48:50                     BLUE HOUSE
## 1385         MX001 Abarrotes 21/06/2020 21:49:07                CREMAX DE NIEVE
## 1386         MX001 Abarrotes 21/06/2020 21:50:21                         EFICAZ
## 1387         MX001 Abarrotes 20/06/2020 18:51:44                       POWERADE
## 1388         MX001 Abarrotes 21/06/2020 21:52:08                      COCA COLA
## 1389         MX001 Abarrotes 21/06/2020 21:52:54                       MARIPOSA
## 1390         MX001 Abarrotes 21/06/2020 21:52:54                        ENSUEÑO
## 1391         MX001 Abarrotes 20/06/2020 18:53:43                      COCA COLA
## 1392         MX001 Abarrotes 21/06/2020 21:52:54                            MAS
## 1393         MX001 Abarrotes 20/06/2020 18:55:25                          SALVO
## 1394         MX001 Abarrotes 21/06/2020 21:54:14                COCA COLA LIGHT
## 1395         MX001 Abarrotes 21/06/2020 21:54:14                         NEVADA
## 1396         MX001 Abarrotes 21/06/2020 21:55:16                          PEPSI
## 1397         MX001 Abarrotes 21/06/2020 21:58:20                COCA COLA LIGHT
## 1398         MX001 Abarrotes 20/06/2020 18:59:42                         SQUIRT
## 1399         MX001 Abarrotes 20/06/2020 19:01:21                       PAKETAXO
## 1400         MX001 Abarrotes 20/06/2020 19:01:21                            LEO
## 1401         MX001 Abarrotes 20/06/2020 19:01:21                       JARRITOS
## 1402         MX001 Abarrotes 20/06/2020 19:01:36                      COCA COLA
## 1403         MX001 Abarrotes 20/06/2020 19:03:44                          PEPSI
## 1404         MX001 Abarrotes 20/06/2020 19:03:44                   BUBBA XTREME
## 1405         MX001 Abarrotes 20/06/2020 19:03:44                          WINIS
## 1406         MX001 Abarrotes 20/06/2020 19:05:23                          KNORR
## 1407         MX001 Abarrotes 20/06/2020 19:06:06                          BIMBO
## 1408         MX001 Abarrotes 21/06/2020 22:02:01                      CHIQUITIN
## 1409         MX001 Abarrotes 20/06/2020 19:07:58                         GAMESA
## 1410         MX001 Abarrotes 21/06/2020 22:02:46                           LALA
## 1411         MX001 Abarrotes 21/06/2020 22:02:46                           TANG
## 1412         MX001 Abarrotes 20/06/2020 19:16:19                           LINK
## 1413         MX001 Abarrotes 21/06/2020 22:03:23                          PEPSI
## 1414         MX001 Abarrotes 21/06/2020 22:03:39                          PINOL
## 1415         MX001 Abarrotes 21/06/2020 22:03:39                          PEPSI
## 1416         MX001 Abarrotes 20/06/2020 19:16:57                        KINDER 
## 1417         MX001 Abarrotes 21/06/2020 22:05:40                       POWERADE
## 1418         MX001 Abarrotes 20/06/2020 19:17:25                          PEPSI
## 1419         MX001 Abarrotes 21/06/2020 22:05:40                     VALLE FRUT
## 1420         MX001 Abarrotes 20/06/2020 19:17:48                        RUFFLES
## 1421         MX001 Abarrotes 21/06/2020 22:06:31                          SALVO
## 1422         MX001 Abarrotes 21/06/2020 22:06:31                    NUTRI LECHE
## 1423         MX001 Abarrotes 20/06/2020 19:21:57                      COCA COLA
## 1424         MX001 Abarrotes 21/06/2020 22:11:02                          PEPSI
## 1425         MX001 Abarrotes 21/06/2020 22:11:02                         SQUIRT
## 1426         MX001 Abarrotes 20/06/2020 19:28:45                      COCA COLA
## 1427         MX001 Abarrotes 21/06/2020 22:13:07                          BIMBO
## 1428         MX001 Abarrotes 21/06/2020 22:14:04                    5 ESTRELLAS
## 1429         MX001 Abarrotes 21/06/2020 22:14:22                       SABRITAS
## 1430         MX001 Abarrotes 20/06/2020 19:35:55                COCA COLA LIGHT
## 1431         MX001 Abarrotes 20/06/2020 19:37:31                           LALA
## 1432         MX001 Abarrotes 20/06/2020 19:37:31                          PEPSI
## 1433         MX001 Abarrotes 21/06/2020 22:18:21                          BEBIN
## 1434         MX001 Abarrotes 21/06/2020 22:19:21                      PALL MALL
## 1435         MX001 Abarrotes 20/06/2020 19:41:14                          HALLS
## 1436         MX001 Abarrotes 20/06/2020 19:42:18                      COCA COLA
## 1437         MX001 Abarrotes 20/06/2020 19:42:43                        CLAMATO
## 1438         MX001 Abarrotes 20/06/2020 19:44:31                          PEPSI
## 1439         MX001 Abarrotes 20/06/2020 19:49:30                      CONVERMEX
## 1440         MX001 Abarrotes 20/06/2020 19:49:30                      CONVERMEX
## 1441         MX001 Abarrotes 21/06/2020 22:23:33                       MARLBORO
## 1442         MX001 Abarrotes 20/06/2020 19:53:07                         SPRITE
## 1443         MX001 Abarrotes 21/06/2020 22:25:30                        RUFFLES
## 1444         MX001 Abarrotes 21/06/2020 22:26:20                       MARINELA
## 1445         MX001 Abarrotes 20/06/2020 19:56:54                      PALL MALL
## 1446         MX001 Abarrotes 20/06/2020 19:58:40                     TOPO CHICO
## 1447         MX001 Abarrotes 20/06/2020 19:58:40                         HERDEZ
## 1448         MX001 Abarrotes 20/06/2020 19:58:40                          PICOT
## 1449         MX001 Abarrotes 20/06/2020 19:58:40                       POWERADE
## 1450         MX001 Abarrotes 21/06/2020 22:27:27                          PEPSI
## 1451         MX001 Abarrotes 21/06/2020 22:29:38                          PEPSI
## 1452         MX001 Abarrotes 21/06/2020 22:30:47                       PAKETAXO
## 1453         MX001 Abarrotes 20/06/2020 20:00:47                          EPURA
## 1454         MX001 Abarrotes 20/06/2020 20:03:54                BENSON & HEDGES
## 1455         MX001 Abarrotes 20/06/2020 20:03:54              EMPERADOR (SENZO)
## 1456         MX001 Abarrotes 20/06/2020 20:06:15                       PAKETAXO
## 1457         MX001 Abarrotes 20/06/2020 20:06:15                      COCA COLA
## 1458         MX001 Abarrotes 21/06/2020 22:36:04                        ENCANTO
## 1459         MX001 Abarrotes 21/06/2020 22:38:13                       DANONINO
## 1460         MX001 Abarrotes 21/06/2020 22:42:50                  FIOR DI PASTA
## 1461         MX001 Abarrotes 21/06/2020 22:42:50                           RAID
## 1462         MX001 Abarrotes 21/06/2020 22:42:50                      CONSOMATE
## 1463         MX001 Abarrotes 21/06/2020 22:42:50                    5 ESTRELLAS
## 1464         MX001 Abarrotes 20/06/2020 20:14:07                         VIRMAR
## 1465         MX001 Abarrotes 21/06/2020 22:46:38                        LA FINA
## 1466         MX001 Abarrotes 21/06/2020 22:46:38                          PEPSI
## 1467         MX001 Abarrotes 20/06/2020 20:16:09                          PEPSI
## 1468         MX001 Abarrotes 21/06/2020 22:49:32                         FRESCA
## 1469         MX001 Abarrotes 21/06/2020 22:51:24                    NUTRI LECHE
## 1470         MX001 Abarrotes 21/06/2020 22:51:24                       POWERADE
## 1471         MX001 Abarrotes 21/06/2020 22:51:24                     LA COSTEÑA
## 1472         MX001 Abarrotes 21/06/2020 22:51:24                    NUTRI LECHE
## 1473         MX001 Abarrotes 21/06/2020 22:51:42                      COCA COLA
## 1474         MX001 Abarrotes 20/06/2020 20:21:29                        RUFFLES
## 1475         MX001 Abarrotes 21/06/2020 22:51:42                       MARINELA
## 1476         MX001 Abarrotes 20/06/2020 20:21:29                     VALLE FRUT
## 1477         MX001 Abarrotes 20/06/2020 20:21:29                           LINK
## 1478         MX001 Abarrotes 20/06/2020 20:21:54                          PEPSI
## 1479         MX001 Abarrotes 21/06/2020 22:53:38                       ACTIVIA 
## 1480         MX001 Abarrotes 20/06/2020 20:22:12                     LA COSTEÑA
## 1481         MX001 Abarrotes 21/06/2020 22:56:55                BENSON & HEDGES
## 1482         MX001 Abarrotes 20/06/2020 20:23:28                            ATM
## 1483         MX001 Abarrotes 21/06/2020 22:58:15                     KLEEN BEBE
## 1484         MX001 Abarrotes 21/06/2020 22:58:15                           LALA
## 1485         MX001 Abarrotes 21/06/2020 22:58:15                       ACTIVIA 
## 1486         MX001 Abarrotes 20/06/2020 20:25:47                          SALVO
## 1487         MX001 Abarrotes 21/06/2020 22:58:35                COCA COLA LIGHT
## 1488         MX001 Abarrotes 20/06/2020 20:29:08                        CHEETOS
## 1489         MX001 Abarrotes 21/06/2020 22:59:13                       PEDIGREE
## 1490         MX001 Abarrotes 21/06/2020 22:59:42                       PAKETAXO
## 1491         MX001 Abarrotes 20/06/2020 20:31:52                          PEPSI
## 1492         MX001 Abarrotes 21/06/2020 23:00:13                       MARINELA
## 1493         MX001 Abarrotes 20/06/2020 20:32:42                       TOSTITOS
## 1494         MX001 Abarrotes 20/06/2020 20:32:42                          PEPSI
## 1495         MX001 Abarrotes 20/06/2020 20:33:06             SALADITAS (GAMESA)
## 1496         MX001 Abarrotes 20/06/2020 20:33:06                          PEPSI
## 1497         MX001 Abarrotes 21/06/2020 23:01:56                       MARLBORO
## 1498         MX001 Abarrotes 20/06/2020 20:35:53                      COCA COLA
## 1499         MX001 Abarrotes 20/06/2020 20:35:53                           JOYA
## 1500         MX001 Abarrotes 20/06/2020 20:37:32                          PEPSI
## 1501         MX001 Abarrotes 21/06/2020 23:05:02                      COCA COLA
## 1502         MX001 Abarrotes 20/06/2020 20:38:21                          PEPSI
## 1503         MX001 Abarrotes 21/06/2020 23:05:02                           LINK
## 1504         MX001 Abarrotes 20/06/2020 20:39:51                          BIMBO
## 1505         MX001 Abarrotes 20/06/2020 20:40:34                       MARLBORO
## 1506         MX001 Abarrotes 21/06/2020 23:06:16                        RUFFLES
## 1507         MX001 Abarrotes 20/06/2020 20:40:34                          PEPSI
## 1508         MX001 Abarrotes 20/06/2020 20:41:24                         FRUTSI
## 1509         MX001 Abarrotes 20/06/2020 20:43:54                    RANCHERITOS
## 1510         MX001 Abarrotes 20/06/2020 20:43:54                           LALA
## 1511         MX001 Abarrotes 20/06/2020 20:43:54                        CAMELIA
## 1512         MX001 Abarrotes 21/06/2020 23:09:05                       BONAFONT
## 1513         MX001 Abarrotes 20/06/2020 20:43:54                      DEL VALLE
## 1514         MX001 Abarrotes 20/06/2020 20:45:29                          BIMBO
## 1515         MX001 Abarrotes 20/06/2020 20:45:29                         DANONE
## 1516         MX001 Abarrotes 21/06/2020 23:10:32                      COCA COLA
## 1517         MX001 Abarrotes 21/06/2020 23:11:17                          BIMBO
## 1518         MX001 Abarrotes 21/06/2020 23:11:48                      COCA COLA
## 1519         MX001 Abarrotes 20/06/2020 20:51:48                      DEL VALLE
## 1520         MX001 Abarrotes 21/06/2020 23:17:51                     VALLE FRUT
## 1521         MX001 Abarrotes 20/06/2020 20:53:40                 ZONA DEL SABOR
## 1522         MX001 Abarrotes 20/06/2020 20:54:09                          PEPSI
## 1523         MX001 Abarrotes 20/06/2020 20:54:09                        ISADORA
## 1524         MX001 Abarrotes 20/06/2020 20:55:09                         FRESCA
## 1525         MX001 Abarrotes 21/06/2020 23:21:27                           JOYA
## 1526         MX001 Abarrotes 20/06/2020 20:56:47                          PEPSI
## 1527         MX001 Abarrotes 21/06/2020 23:24:37                         TECATE
## 1528         MX001 Abarrotes 20/06/2020 20:56:47                 COCA COLA ZERO
## 1529         MX001 Abarrotes 21/06/2020 23:24:37                      CONSOMATE
## 1530         MX001 Abarrotes 20/06/2020 20:56:47                      CONVERMEX
## 1531         MX001 Abarrotes 20/06/2020 20:56:47                      CONVERMEX
## 1532         MX001 Abarrotes 21/06/2020 23:25:04             CHEESE PUFFS (LEO)
## 1533         MX001 Abarrotes 21/06/2020 23:25:04                          BIMBO
## 1534         MX001 Abarrotes 20/06/2020 21:02:07                        ENCANTO
## 1535         MX001 Abarrotes 21/06/2020 23:25:42                     LA COSTEÑA
## 1536         MX001 Abarrotes 21/06/2020 23:25:42     BLANCA NIEVES (DETERGENTE)
## 1537         MX001 Abarrotes 21/06/2020 23:25:42                            FUD
## 1538         MX001 Abarrotes 21/06/2020 23:25:42                      COCA COLA
## 1539         MX001 Abarrotes 20/06/2020 21:02:07                      CONCHITAS
## 1540         MX001 Abarrotes 20/06/2020 21:02:07                    PAPIRRINGAS
## 1541         MX001 Abarrotes 21/06/2020 23:25:42                       CLORALEX
## 1542         MX001 Abarrotes 20/06/2020 21:02:36                       POWERADE
## 1543         MX001 Abarrotes 21/06/2020 23:29:04                            LEO
## 1544         MX001 Abarrotes 21/06/2020 23:31:14                       POWERADE
## 1545         MX001 Abarrotes 20/06/2020 21:05:34                           LALA
## 1546         MX001 Abarrotes 20/06/2020 21:08:05                          EPURA
## 1547         MX001 Abarrotes 21/06/2020 23:35:08                           LINK
## 1548         MX001 Abarrotes 20/06/2020 21:08:38                      COCA COLA
## 1549         MX001 Abarrotes 20/06/2020 21:08:38                           JOYA
## 1550         MX001 Abarrotes 20/06/2020 21:09:24                         SQUIRT
## 1551         MX001 Abarrotes 20/06/2020 21:09:47                         SAVILé
## 1552         MX001 Abarrotes 20/06/2020 21:11:21                    PERMA SHARP
## 1553         MX001 Abarrotes 21/06/2020 23:38:36                       MARINELA
## 1554         MX001 Abarrotes 21/06/2020 23:40:03                       MARINELA
## 1555         MX001 Abarrotes 21/06/2020 23:40:24                         ACT II
## 1556         MX001 Abarrotes 20/06/2020 21:13:54                         FRUTSI
## 1557         MX001 Abarrotes 21/06/2020 23:40:24                       MARINELA
## 1558         MX001 Abarrotes 20/06/2020 21:14:19                        CHEETOS
## 1559         MX001 Abarrotes 21/06/2020 23:40:46                           LINK
## 1560         MX001 Abarrotes 20/06/2020 21:16:25                      COCA COLA
## 1561         MX001 Abarrotes 20/06/2020 21:16:25                        RUFFLES
## 1562         MX001 Abarrotes 20/06/2020 21:16:25                      COCA COLA
## 1563         MX001 Abarrotes 20/06/2020 21:16:57                          KNORR
## 1564         MX001 Abarrotes 21/06/2020 23:41:47                          PEPSI
## 1565         MX001 Abarrotes 20/06/2020 21:16:57                    PEPSI LIGHT
## 1566         MX001 Abarrotes 20/06/2020 21:16:57                            FUD
## 1567         MX001 Abarrotes 21/06/2020 23:41:47                     DEL FUERTE
## 1568         MX001 Abarrotes 20/06/2020 21:16:57                        ISADORA
## 1569         MX001 Abarrotes 20/06/2020 21:17:43                           LALA
## 1570         MX001 Abarrotes 21/06/2020 23:46:47                         SQUIRT
## 1571         MX001 Abarrotes 21/06/2020 23:47:03                          PINOL
## 1572         MX001 Abarrotes 20/06/2020 21:24:06                            LEO
## 1573         MX001 Abarrotes 20/06/2020 21:24:06                      COCA COLA
## 1574         MX001 Abarrotes 21/06/2020 23:48:11                           TANG
## 1575         MX001 Abarrotes 20/06/2020 21:26:18                      DEL VALLE
## 1576         MX001 Abarrotes 20/06/2020 21:26:58                          PEPSI
## 1577         MX001 Abarrotes 20/06/2020 21:28:52                          PEPSI
## 1578         MX001 Abarrotes 20/06/2020 21:31:08                       GATORADE
## 1579         MX001 Abarrotes 21/06/2020 23:51:49                         GAMESA
## 1580         MX001 Abarrotes 21/06/2020 23:51:49                    NUTRI LECHE
## 1581         MX001 Abarrotes 21/06/2020 23:53:00                        CLAMATO
## 1582         MX001 Abarrotes 20/06/2020 21:31:45                       TOSTITOS
## 1583         MX001 Abarrotes 21/06/2020 23:53:40                          PEPSI
## 1584         MX001 Abarrotes 21/06/2020 23:55:58                          BIMBO
## 1585         MX001 Abarrotes 21/06/2020 23:55:58                     LA VILLITA
## 1586         MX001 Abarrotes 21/06/2020 23:58:26                         BOGO´S
## 1587         MX001 Abarrotes 21/06/2020 23:58:26                         BOGO´S
## 1588         MX001 Abarrotes 20/06/2020 21:34:00                        KINDER 
## 1589         MX001 Abarrotes 20/06/2020 21:34:34                      COCA COLA
## 1590         MX001 Abarrotes 20/06/2020 21:37:26                           ZOTE
## 1591         MX001 Abarrotes 20/06/2020 21:37:26                           FOCA
## 1592         MX001 Abarrotes 22/06/2020 00:02:48                            FUD
## 1593         MX001 Abarrotes 22/06/2020 00:02:48                          BIMBO
## 1594         MX001 Abarrotes 22/06/2020 00:02:48                     BLUE HOUSE
## 1595         MX001 Abarrotes 22/06/2020 00:04:55                          PEPSI
## 1596         MX001 Abarrotes 20/06/2020 21:38:46                      COCA COLA
## 1597         MX001 Abarrotes 22/06/2020 00:05:55                           LALA
## 1598         MX001 Abarrotes 22/06/2020 00:06:18                     TOPO CHICO
## 1599         MX001 Abarrotes 22/06/2020 00:07:33                          BIMBO
## 1600         MX001 Abarrotes 20/06/2020 21:41:59                           LALA
## 1601         MX001 Abarrotes 20/06/2020 21:41:59                          BIMBO
## 1602         MX001 Abarrotes 22/06/2020 00:10:13                          BIMBO
## 1603         MX001 Abarrotes 22/06/2020 00:10:13                           LALA
## 1604         MX001 Abarrotes 22/06/2020 00:10:13                       MARINELA
## 1605         MX001 Abarrotes 20/06/2020 21:41:59                      COCA COLA
## 1606         MX001 Abarrotes 22/06/2020 00:10:13                          PEPSI
## 1607         MX001 Abarrotes 22/06/2020 00:10:13                     CHOCO MILK
## 1608         MX001 Abarrotes 22/06/2020 00:10:58                         GAMESA
## 1609         MX001 Abarrotes 22/06/2020 00:10:58                          EPURA
## 1610         MX001 Abarrotes 22/06/2020 00:11:26                      COCA COLA
## 1611         MX001 Abarrotes 20/06/2020 21:43:40                      COCA COLA
## 1612         MX001 Abarrotes 22/06/2020 00:12:05                      COCA COLA
## 1613         MX001 Abarrotes 20/06/2020 21:45:12                          PEPSI
## 1614         MX001 Abarrotes 20/06/2020 21:45:22                         SQUIRT
## 1615         MX001 Abarrotes 20/06/2020 21:45:43                          BIMBO
## 1616         MX001 Abarrotes 20/06/2020 21:45:43                COCA COLA LIGHT
## 1617         MX001 Abarrotes 20/06/2020 21:45:43                           JOYA
## 1618         MX001 Abarrotes 22/06/2020 08:55:06                          PEPSI
## 1619         MX001 Abarrotes 20/06/2020 21:47:36                           LINK
## 1620         MX001 Abarrotes 22/06/2020 08:55:06                        ISADORA
## 1621         MX001 Abarrotes 22/06/2020 08:56:13                    SANTA CLARA
## 1622         MX001 Abarrotes 20/06/2020 21:49:56                        KINDER 
## 1623         MX001 Abarrotes 20/06/2020 21:51:38                      CONVERMEX
## 1624         MX001 Abarrotes 22/06/2020 09:09:21                          PEPSI
## 1625         MX001 Abarrotes 20/06/2020 21:52:17                        MIRINDA
## 1626         MX001 Abarrotes 20/06/2020 21:55:03                        NESCAFE
## 1627         MX001 Abarrotes 20/06/2020 21:55:18                           LALA
## 1628         MX001 Abarrotes 20/06/2020 21:57:39                       SEVEN UP
## 1629         MX001 Abarrotes 22/06/2020 09:15:49                    NUTRI LECHE
## 1630         MX001 Abarrotes 22/06/2020 09:16:32                          JUMEX
## 1631         MX001 Abarrotes 20/06/2020 21:59:21                           JOYA
## 1632         MX001 Abarrotes 22/06/2020 09:16:59                          BIMBO
## 1633         MX001 Abarrotes 22/06/2020 09:41:33                           TANG
## 1634         MX001 Abarrotes 22/06/2020 09:47:23                           LALA
## 1635         MX001 Abarrotes 20/06/2020 22:01:37                          HALLS
## 1636         MX001 Abarrotes 22/06/2020 09:50:02                          PEPSI
## 1637         MX001 Abarrotes 20/06/2020 22:02:27                          PEPSI
## 1638         MX001 Abarrotes 22/06/2020 09:54:31                          AXION
## 1639         MX001 Abarrotes 22/06/2020 09:54:31                            EGO
## 1640         MX001 Abarrotes 20/06/2020 22:03:33                       SABRITAS
## 1641         MX001 Abarrotes 22/06/2020 09:55:23                           LINK
## 1642         MX001 Abarrotes 22/06/2020 09:55:23                      PALL MALL
## 1643         MX001 Abarrotes 20/06/2020 22:03:33                        MIRINDA
## 1644         MX001 Abarrotes 20/06/2020 22:06:54                          PEPSI
## 1645         MX001 Abarrotes 20/06/2020 22:07:43                     TOPO CHICO
## 1646         MX001 Abarrotes 22/06/2020 10:30:09                    NUTRI LECHE
## 1647         MX001 Abarrotes 20/06/2020 22:10:07                          PEPSI
## 1648         MX001 Abarrotes 22/06/2020 10:30:09                    5 ESTRELLAS
## 1649         MX001 Abarrotes 20/06/2020 22:10:50                          BIMBO
## 1650         MX001 Abarrotes 22/06/2020 10:42:14                      CONSOMATE
## 1651         MX001 Abarrotes 20/06/2020 22:15:30                     TOPO CHICO
## 1652         MX001 Abarrotes 20/06/2020 22:15:30                      COCA COLA
## 1653         MX001 Abarrotes 20/06/2020 22:15:30                         SPRITE
## 1654         MX001 Abarrotes 20/06/2020 22:15:30                           JOYA
## 1655         MX001 Abarrotes 20/06/2020 22:15:48                      COCA COLA
## 1656         MX001 Abarrotes 22/06/2020 11:11:30                      COCA COLA
## 1657         MX001 Abarrotes 22/06/2020 11:11:30                COCA COLA LIGHT
## 1658         MX001 Abarrotes 20/06/2020 22:17:21                       MARLBORO
## 1659         MX001 Abarrotes 20/06/2020 22:19:14                      DEL VALLE
## 1660         MX001 Abarrotes 20/06/2020 22:21:20                           LINK
## 1661         MX001 Abarrotes 22/06/2020 11:55:27                          PEPSI
## 1662         MX001 Abarrotes 22/06/2020 11:55:27                           LINK
## 1663         MX001 Abarrotes 20/06/2020 22:22:52                      COCA COLA
## 1664         MX001 Abarrotes 20/06/2020 22:22:52                      DEL VALLE
## 1665         MX001 Abarrotes 20/06/2020 22:22:52                      CONVERMEX
## 1666         MX001 Abarrotes 20/06/2020 22:24:23                          PEPSI
## 1667         MX001 Abarrotes 20/06/2020 22:25:33                      COCA COLA
## 1668         MX001 Abarrotes 20/06/2020 22:26:24                       MARLBORO
## 1669         MX001 Abarrotes 22/06/2020 12:12:20                       MARLBORO
## 1670         MX001 Abarrotes 22/06/2020 12:14:30                          PEPSI
## 1671         MX001 Abarrotes 22/06/2020 12:15:09                          BIMBO
## 1672         MX001 Abarrotes 20/06/2020 22:27:18                          PEPSI
## 1673         MX001 Abarrotes 20/06/2020 22:27:18                           LINK
## 1674         MX001 Abarrotes 22/06/2020 12:15:44                       MARUCHAN
## 1675         MX001 Abarrotes 20/06/2020 22:27:48                          PEPSI
## 1676         MX001 Abarrotes 20/06/2020 22:28:05                          PEPSI
## 1677         MX001 Abarrotes 22/06/2020 12:16:09                      PALL MALL
## 1678         MX001 Abarrotes 20/06/2020 22:32:15                       PEDIGREE
## 1679         MX001 Abarrotes 22/06/2020 12:20:20             SALADITAS (GAMESA)
## 1680         MX001 Abarrotes 22/06/2020 12:20:20                          PEPSI
## 1681         MX001 Abarrotes 20/06/2020 22:34:16                          PEPSI
## 1682         MX001 Abarrotes 22/06/2020 12:20:35                          BIMBO
## 1683         MX001 Abarrotes 22/06/2020 12:21:16                          FANTA
## 1684         MX001 Abarrotes 20/06/2020 22:35:31                       POWERADE
## 1685         MX001 Abarrotes 22/06/2020 12:21:34                      COCA COLA
## 1686         MX001 Abarrotes 22/06/2020 12:26:37                          BIMBO
## 1687         MX001 Abarrotes 20/06/2020 22:36:14                       MARLBORO
## 1688         MX001 Abarrotes 22/06/2020 12:26:37                           ZUKO
## 1689         MX001 Abarrotes 22/06/2020 12:29:16                          PEPSI
## 1690         MX001 Abarrotes 22/06/2020 12:32:07                VELADORA MEXICO
## 1691         MX001 Abarrotes 20/06/2020 22:38:01                          PEPSI
## 1692         MX001 Abarrotes 22/06/2020 12:32:07                      DEL VALLE
## 1693         MX001 Abarrotes 22/06/2020 12:32:07                         NEVADA
## 1694         MX001 Abarrotes 20/06/2020 22:38:13                      COCA COLA
## 1695         MX001 Abarrotes 22/06/2020 12:33:44                  VARIOS DANONE
## 1696         MX001 Abarrotes 20/06/2020 22:38:36                       GATORADE
## 1697         MX001 Abarrotes 22/06/2020 12:33:44                          PEPSI
## 1698         MX001 Abarrotes 22/06/2020 12:33:44                          EPURA
## 1699         MX001 Abarrotes 20/06/2020 22:39:04                      BUBU LUBU
## 1700         MX001 Abarrotes 22/06/2020 12:34:34                          PEPSI
## 1701         MX001 Abarrotes 20/06/2020 22:40:13                        RUFFLES
## 1702         MX001 Abarrotes 20/06/2020 22:40:13                    NUTRI LECHE
## 1703         MX001 Abarrotes 22/06/2020 12:36:32                      COCA COLA
## 1704         MX001 Abarrotes 22/06/2020 12:37:13                           LALA
## 1705         MX001 Abarrotes 20/06/2020 22:41:40                          PICOT
## 1706         MX001 Abarrotes 20/06/2020 22:42:56                           JOYA
## 1707         MX001 Abarrotes 20/06/2020 22:45:27                        RUFFLES
## 1708         MX001 Abarrotes 20/06/2020 22:45:27                     SABRITONES
## 1709         MX001 Abarrotes 20/06/2020 22:45:27                       SABRITAS
## 1710         MX001 Abarrotes 22/06/2020 12:39:32                          DOWNY
## 1711         MX001 Abarrotes 22/06/2020 12:39:32                      COCA COLA
## 1712         MX001 Abarrotes 22/06/2020 12:39:32                        ISADORA
## 1713         MX001 Abarrotes 22/06/2020 12:40:49                       CLORALEX
## 1714         MX001 Abarrotes 22/06/2020 12:40:49                         GERBER
## 1715         MX001 Abarrotes 22/06/2020 12:40:49                            ACE
## 1716         MX001 Abarrotes 22/06/2020 12:40:49                          PEPSI
## 1717         MX001 Abarrotes 20/06/2020 22:47:37                      COCA COLA
## 1718         MX001 Abarrotes 22/06/2020 12:42:31                  SIDRAL MUNDET
## 1719         MX001 Abarrotes 22/06/2020 12:42:49                          PEPSI
## 1720         MX001 Abarrotes 22/06/2020 12:42:49                          EPURA
## 1721         MX001 Abarrotes 22/06/2020 12:43:19                        MIRINDA
## 1722         MX001 Abarrotes 22/06/2020 12:44:53                          BIMBO
## 1723         MX001 Abarrotes 22/06/2020 12:45:04                          EPURA
## 1724         MX001 Abarrotes 22/06/2020 12:45:46                           LALA
## 1725         MX001 Abarrotes 20/06/2020 22:54:08                           LALA
## 1726         MX001 Abarrotes 20/06/2020 22:54:08                  MANZANITA SOL
## 1727         MX001 Abarrotes 20/06/2020 22:54:08                        SELECTA
## 1728         MX001 Abarrotes 22/06/2020 12:46:59                           JOYA
## 1729         MX001 Abarrotes 20/06/2020 22:54:43                           LALA
## 1730         MX001 Abarrotes 22/06/2020 12:48:07                      COCA COLA
## 1731         MX001 Abarrotes 22/06/2020 12:50:34                      COCA COLA
## 1732         MX001 Abarrotes 22/06/2020 12:50:34                           VERO
## 1733         MX001 Abarrotes 20/06/2020 22:55:24                            M&M
## 1734         MX001 Abarrotes 22/06/2020 12:54:21                            MAS
## 1735         MX001 Abarrotes 22/06/2020 12:55:37                        RUFFLES
## 1736         MX001 Abarrotes 22/06/2020 12:55:37                        BOKADOS
## 1737         MX001 Abarrotes 20/06/2020 22:58:30                          PEPSI
## 1738         MX001 Abarrotes 22/06/2020 12:56:15                      CONSOMATE
## 1739         MX001 Abarrotes 20/06/2020 23:00:16                       FRUTIMAX
## 1740         MX001 Abarrotes 22/06/2020 12:57:10                      COCA COLA
## 1741         MX001 Abarrotes 22/06/2020 13:00:14                      COCA COLA
## 1742         MX001 Abarrotes 22/06/2020 13:00:14                          FANTA
## 1743         MX001 Abarrotes 22/06/2020 13:00:14                        ISADORA
## 1744         MX001 Abarrotes 22/06/2020 13:01:26             SALADITAS (GAMESA)
## 1745         MX001 Abarrotes 22/06/2020 13:01:26                        MAZATUN
## 1746         MX001 Abarrotes 22/06/2020 13:01:59                          LUCAS
## 1747         MX001 Abarrotes 22/06/2020 13:02:19                      COCA COLA
## 1748         MX001 Abarrotes 22/06/2020 13:03:42                     DOÑA MARIA
## 1749         MX001 Abarrotes 22/06/2020 13:03:42     BLANCA NIEVES (DETERGENTE)
## 1750         MX001 Abarrotes 22/06/2020 13:03:42                       SUAVITEL
## 1751         MX001 Abarrotes 20/06/2020 23:09:29                     CHURRUMAIS
## 1752         MX001 Abarrotes 22/06/2020 13:04:17                          MAMUT
## 1753         MX001 Abarrotes 22/06/2020 13:04:17                          PEPSI
## 1754         MX001 Abarrotes 20/06/2020 23:10:32                          PEPSI
## 1755         MX001 Abarrotes 22/06/2020 13:05:42                        ISADORA
## 1756         MX001 Abarrotes 20/06/2020 23:11:38                       MARLBORO
## 1757         MX001 Abarrotes 22/06/2020 13:08:06                          PINOL
## 1758         MX001 Abarrotes 20/06/2020 23:12:40                          SALVO
## 1759         MX001 Abarrotes 20/06/2020 23:12:40                         VELVET
## 1760         MX001 Abarrotes 20/06/2020 23:15:20                       MARLBORO
## 1761         MX001 Abarrotes 20/06/2020 23:18:25                        CLAMATO
## 1762         MX001 Abarrotes 20/06/2020 23:21:37                       TOSTITOS
## 1763         MX001 Abarrotes 20/06/2020 23:21:37     BLANCA NIEVES (DETERGENTE)
## 1764         MX001 Abarrotes 20/06/2020 23:21:37                    PAPIRRINGAS
## 1765         MX001 Abarrotes 20/06/2020 23:21:37                    5 ESTRELLAS
## 1766         MX001 Abarrotes 20/06/2020 23:22:18                         CHOKIS
## 1767         MX001 Abarrotes 20/06/2020 23:22:18                        DORITOS
## 1768         MX001 Abarrotes 20/06/2020 23:22:36                          PEPSI
## 1769         MX001 Abarrotes 22/06/2020 13:20:56                          PEPSI
## 1770         MX001 Abarrotes 22/06/2020 13:27:13                          PEPSI
## 1771         MX001 Abarrotes 20/06/2020 23:25:47                           LALA
## 1772         MX001 Abarrotes 20/06/2020 23:27:58                          PICOT
## 1773         MX001 Abarrotes 22/06/2020 13:34:12                      COCA COLA
## 1774         MX001 Abarrotes 22/06/2020 13:34:12                      CONSOMATE
## 1775         MX001 Abarrotes 20/06/2020 23:27:58                         SPRITE
## 1776         MX001 Abarrotes 22/06/2020 13:38:27                          PEPSI
## 1777         MX001 Abarrotes 22/06/2020 13:42:18                    RANCH STYLE
## 1778         MX001 Abarrotes 22/06/2020 13:42:18                      COCA COLA
## 1779         MX001 Abarrotes 22/06/2020 13:47:25                      COCA COLA
## 1780         MX001 Abarrotes 22/06/2020 13:47:25                      CONSOMATE
## 1781         MX001 Abarrotes 22/06/2020 13:48:55                           ZOTE
## 1782         MX001 Abarrotes 20/06/2020 23:31:07                           LINK
## 1783         MX001 Abarrotes 22/06/2020 13:48:55                  SIDRAL MUNDET
## 1784         MX001 Abarrotes 22/06/2020 13:48:55                           JOYA
## 1785         MX001 Abarrotes 22/06/2020 13:51:17                        BOKADOS
## 1786         MX001 Abarrotes 20/06/2020 23:32:32                      PALL MALL
## 1787         MX001 Abarrotes 22/06/2020 13:53:49                        BOKADOS
## 1788         MX001 Abarrotes 20/06/2020 23:33:26                          BIMBO
## 1789         MX001 Abarrotes 22/06/2020 13:53:49             SALADITAS (GAMESA)
## 1790         MX001 Abarrotes 22/06/2020 13:53:49                          JUMEX
## 1791         MX001 Abarrotes 20/06/2020 23:33:26                      COCA COLA
## 1792         MX001 Abarrotes 20/06/2020 23:33:26                          BIMBO
## 1793         MX001 Abarrotes 20/06/2020 23:33:26                          MAMUT
## 1794         MX001 Abarrotes 20/06/2020 23:34:23                  MANZANITA SOL
## 1795         MX001 Abarrotes 22/06/2020 13:58:34                          BIMBO
## 1796         MX001 Abarrotes 22/06/2020 13:58:34                          MAMUT
## 1797         MX001 Abarrotes 22/06/2020 13:58:34 CHICHARRON DE CERDO (SABRITAS)
## 1798         MX001 Abarrotes 22/06/2020 13:58:34                        MIRINDA
## 1799         MX001 Abarrotes 20/06/2020 23:35:11                     TOPO CHICO
## 1800         MX001 Abarrotes 22/06/2020 14:21:28                          PEPSI
## 1801         MX001 Abarrotes 20/06/2020 23:35:38                      PALL MALL
## 1802         MX001 Abarrotes 20/06/2020 23:36:35                           LALA
## 1803         MX001 Abarrotes 22/06/2020 14:37:34                          BIMBO
## 1804         MX001 Abarrotes 22/06/2020 14:37:34                         VIRMAR
## 1805         MX001 Abarrotes 20/06/2020 23:37:55                     SABRITONES
## 1806         MX001 Abarrotes 20/06/2020 23:37:55                        CHEETOS
## 1807         MX001 Abarrotes 22/06/2020 14:45:46                       PEDIGREE
## 1808         MX001 Abarrotes 20/06/2020 23:38:21                      COCA COLA
## 1809         MX001 Abarrotes 22/06/2020 14:46:02                        MONARCA
## 1810         MX001 Abarrotes 20/06/2020 23:38:21                           JOYA
## 1811         MX001 Abarrotes 20/06/2020 23:39:52                       SABRITAS
## 1812         MX001 Abarrotes 22/06/2020 14:53:15                          PEPSI
## 1813         MX001 Abarrotes 22/06/2020 14:54:23                     CHURRUMAIS
## 1814         MX001 Abarrotes 22/06/2020 14:54:46                        CLAMATO
## 1815         MX001 Abarrotes 20/06/2020 23:41:45                          BIMBO
## 1816         MX001 Abarrotes 20/06/2020 23:41:45                           LALA
## 1817         MX001 Abarrotes 22/06/2020 14:58:10                      COCA COLA
## 1818         MX001 Abarrotes 22/06/2020 14:58:10                           LINK
## 1819         MX001 Abarrotes 20/06/2020 23:47:32                           JOYA
## 1820         MX001 Abarrotes 22/06/2020 15:03:53                          BIMBO
## 1821         MX001 Abarrotes 20/06/2020 23:48:05                          ARIEL
## 1822         MX001 Abarrotes 22/06/2020 15:38:48                       MARINELA
## 1823         MX001 Abarrotes 20/06/2020 23:48:05                          DOWNY
## 1824         MX001 Abarrotes 20/06/2020 23:48:05                          PEPSI
## 1825         MX001 Abarrotes 20/06/2020 23:48:34                     TOPO CHICO
## 1826         MX001 Abarrotes 22/06/2020 15:39:41                       MARINELA
## 1827         MX001 Abarrotes 20/06/2020 23:49:34                     LA COSTEÑA
## 1828         MX001 Abarrotes 20/06/2020 23:49:34                          PEPSI
## 1829         MX001 Abarrotes 22/06/2020 15:39:56                          PEPSI
## 1830         MX001 Abarrotes 20/06/2020 23:51:29                       MARLBORO
## 1831         MX001 Abarrotes 20/06/2020 23:53:02                          PEPSI
## 1832         MX001 Abarrotes 20/06/2020 23:53:02                        PREMIER
## 1833         MX001 Abarrotes 20/06/2020 23:54:34                       MARLBORO
## 1834         MX001 Abarrotes 20/06/2020 23:55:42                      COCA COLA
## 1835         MX001 Abarrotes 20/06/2020 23:56:11                           BIDA
## 1836         MX001 Abarrotes 20/06/2020 23:56:11                          JUMEX
## 1837         MX001 Abarrotes 20/06/2020 23:56:11                       MARINELA
## 1838         MX001 Abarrotes 22/06/2020 15:47:31                    PAPIRRINGAS
## 1839         MX001 Abarrotes 22/06/2020 15:48:04                        MASSISO
## 1840         MX001 Abarrotes 22/06/2020 15:48:04                         ACT II
## 1841         MX001 Abarrotes 22/06/2020 15:48:04                          EPURA
## 1842         MX001 Abarrotes 22/06/2020 15:49:16                         ACT II
## 1843         MX001 Abarrotes 22/06/2020 15:49:16                        DORITOS
## 1844         MX001 Abarrotes 22/06/2020 15:51:58                          PEPSI
## 1845         MX001 Abarrotes 22/06/2020 15:56:35                      COCA COLA
## 1846         MX001 Abarrotes 22/06/2020 15:56:35                           JOYA
## 1847         MX001 Abarrotes 21/06/2020 00:00:27                      COCA COLA
## 1848         MX001 Abarrotes 22/06/2020 15:58:46                      LA SIERRA
## 1849         MX001 Abarrotes 22/06/2020 16:13:50                      COCA COLA
## 1850         MX001 Abarrotes 21/06/2020 00:00:45                 COCA COLA ZERO
## 1851         MX001 Abarrotes 21/06/2020 00:01:40                           NIDO
## 1852         MX001 Abarrotes 21/06/2020 00:02:20                          JUMEX
## 1853         MX001 Abarrotes 21/06/2020 00:02:20              EMPERADOR (SENZO)
## 1854         MX001 Abarrotes 21/06/2020 00:03:22                       MARUCHAN
## 1855         MX001 Abarrotes 21/06/2020 00:03:22                        RUFFLES
## 1856         MX001 Abarrotes 21/06/2020 00:03:22                       MARUCHAN
## 1857         MX001 Abarrotes 21/06/2020 00:03:22                          PEPSI
## 1858         MX001 Abarrotes 21/06/2020 00:04:33                          BIMBO
## 1859         MX001 Abarrotes 21/06/2020 00:04:33                          PEPSI
## 1860         MX001 Abarrotes 22/06/2020 18:45:40                      COCA COLA
## 1861         MX001 Abarrotes 21/06/2020 00:05:53                       SABRITAS
## 1862         MX001 Abarrotes 21/06/2020 00:05:53                       POWERADE
## 1863         MX001 Abarrotes 21/06/2020 00:06:10                     TOPO CHICO
## 1864         MX001 Abarrotes 22/06/2020 18:46:35                       JARRITOS
## 1865         MX001 Abarrotes 21/06/2020 00:06:36                       MARLBORO
## 1866         MX001 Abarrotes 22/06/2020 18:57:28                        RUFFLES
## 1867         MX001 Abarrotes 22/06/2020 18:57:28                      COCA COLA
## 1868         MX001 Abarrotes 22/06/2020 18:57:28                         BOGO´S
## 1869         MX001 Abarrotes 21/06/2020 00:08:09                      COCA COLA
## 1870         MX001 Abarrotes 21/06/2020 00:08:26                    NUTRI LECHE
## 1871         MX001 Abarrotes 22/06/2020 19:05:16                          PEPSI
## 1872         MX001 Abarrotes 21/06/2020 00:12:30                          PEPSI
## 1873         MX001 Abarrotes 21/06/2020 00:15:03                          PEPSI
## 1874         MX001 Abarrotes 22/06/2020 19:08:48                        LA FINA
## 1875         MX001 Abarrotes 21/06/2020 00:20:53                       MARINELA
## 1876         MX001 Abarrotes 22/06/2020 19:10:15                       MARUCHAN
## 1877         MX001 Abarrotes 22/06/2020 19:10:15                      COCA COLA
## 1878         MX001 Abarrotes 21/06/2020 00:20:53                          PEPSI
## 1879         MX001 Abarrotes 21/06/2020 00:21:25                       MARINELA
## 1880         MX001 Abarrotes 22/06/2020 19:11:27                      COCA COLA
## 1881         MX001 Abarrotes 22/06/2020 19:11:27                     VALLE FRUT
## 1882         MX001 Abarrotes 21/06/2020 00:21:58                           INCA
## 1883         MX001 Abarrotes 21/06/2020 00:22:39                        RUFFLES
## 1884         MX001 Abarrotes 22/06/2020 20:50:58                 COCA COLA ZERO
## 1885         MX001 Abarrotes 22/06/2020 20:52:37                  MANZANITA SOL
## 1886         MX001 Abarrotes 22/06/2020 20:53:04                       FRUTIMAX
## 1887         MX001 Abarrotes 22/06/2020 20:53:04                       FRUTIMAX
## 1888         MX001 Abarrotes 22/06/2020 20:53:18                         MASECA
## 1889         MX001 Abarrotes 21/06/2020 00:29:01                     VALLE FRUT
## 1890         MX001 Abarrotes 22/06/2020 20:53:39                          LUCAS
## 1891         MX001 Abarrotes 21/06/2020 00:29:01                         FRESCA
## 1892         MX001 Abarrotes 21/06/2020 00:31:51                      COCA COLA
## 1893         MX001 Abarrotes 22/06/2020 20:54:18                          ARIEL
## 1894         MX001 Abarrotes 22/06/2020 20:54:18                          PEPSI
## 1895         MX001 Abarrotes 21/06/2020 00:32:33                      DEL VALLE
## 1896         MX001 Abarrotes 22/06/2020 20:55:02                          BIMBO
## 1897         MX001 Abarrotes 22/06/2020 20:55:02                     HELLMANN´S
## 1898         MX001 Abarrotes 22/06/2020 20:55:02                           TANG
## 1899         MX001 Abarrotes 22/06/2020 20:55:26                            LEO
## 1900         MX001 Abarrotes 21/06/2020 00:33:48                          PEPSI
## 1901         MX001 Abarrotes 22/06/2020 20:55:26                COCA COLA LIGHT
## 1902         MX001 Abarrotes 21/06/2020 00:34:34                      PALL MALL
## 1903         MX001 Abarrotes 22/06/2020 20:57:04                      COCA COLA
## 1904         MX001 Abarrotes 22/06/2020 20:59:00                          PEPSI
## 1905         MX001 Abarrotes 21/06/2020 00:41:06               RICOLINO (DULCE)
## 1906         MX001 Abarrotes 21/06/2020 00:41:31                          PEPSI
## 1907         MX001 Abarrotes 22/06/2020 21:02:48                          BIMBO
## 1908         MX001 Abarrotes 21/06/2020 00:41:50                           LALA
## 1909         MX001 Abarrotes 22/06/2020 21:03:27                        LA FINA
## 1910         MX001 Abarrotes 22/06/2020 21:04:00                       POWERADE
## 1911         MX001 Abarrotes 22/06/2020 21:05:05                          BIMBO
## 1912         MX001 Abarrotes 22/06/2020 21:05:05                  MANZANITA SOL
## 1913         MX001 Abarrotes 22/06/2020 21:05:05                   BUBBA XTREME
## 1914         MX001 Abarrotes 21/06/2020 00:44:26                         SQUIRT
## 1915         MX001 Abarrotes 21/06/2020 00:44:52                       PRINGLES
## 1916         MX001 Abarrotes 21/06/2020 00:45:39                          BIMBO
## 1917         MX001 Abarrotes 21/06/2020 00:48:12                        RUFFLES
## 1918         MX001 Abarrotes 21/06/2020 00:48:12                          BIMBO
## 1919         MX001 Abarrotes 21/06/2020 00:48:12                  MANZANITA SOL
## 1920         MX001 Abarrotes 21/06/2020 00:48:44                          PEPSI
## 1921         MX001 Abarrotes 22/06/2020 21:20:17                          PEPSI
## 1922         MX001 Abarrotes 22/06/2020 21:21:06                           LALA
## 1923         MX001 Abarrotes 21/06/2020 00:50:20                       MARLBORO
## 1924         MX001 Abarrotes 22/06/2020 21:21:06                           TANG
## 1925         MX001 Abarrotes 22/06/2020 21:22:05                          BIMBO
## 1926         MX001 Abarrotes 21/06/2020 00:50:56                       MARLBORO
## 1927         MX001 Abarrotes 21/06/2020 00:52:32      CHICHARRONES HARINA (BK2)
## 1928         MX001 Abarrotes 21/06/2020 00:52:32                          BIMBO
## 1929         MX001 Abarrotes 21/06/2020 00:52:32                           TANG
## 1930         MX001 Abarrotes 22/06/2020 21:25:19                       MARLBORO
## 1931         MX001 Abarrotes 21/06/2020 00:52:32                           TANG
## 1932         MX001 Abarrotes 22/06/2020 21:25:46                         CHOKIS
## 1933         MX001 Abarrotes 22/06/2020 21:25:46                       MARINELA
## 1934         MX001 Abarrotes 22/06/2020 21:26:28                          BIMBO
## 1935         MX001 Abarrotes 22/06/2020 21:26:47                      DEL VALLE
## 1936         MX001 Abarrotes 22/06/2020 21:27:23                          PEPSI
## 1937         MX001 Abarrotes 21/06/2020 01:03:19                         FRUTSI
## 1938         MX001 Abarrotes 22/06/2020 21:30:46                           ZOTE
## 1939         MX001 Abarrotes 21/06/2020 01:03:19                          BIMBO
## 1940         MX001 Abarrotes 21/06/2020 01:03:51                          BIMBO
## 1941         MX001 Abarrotes 21/06/2020 01:03:51                       SABRITAS
## 1942         MX001 Abarrotes 21/06/2020 01:03:51                          BIMBO
## 1943         MX001 Abarrotes 21/06/2020 01:03:51                          PEPSI
## 1944         MX001 Abarrotes 22/06/2020 21:32:49                        PRISPAS
## 1945         MX001 Abarrotes 22/06/2020 21:32:49                       TOSTITOS
## 1946         MX001 Abarrotes 22/06/2020 21:32:49                       TOSTITOS
## 1947         MX001 Abarrotes 22/06/2020 21:32:49                       SABRITAS
## 1948         MX001 Abarrotes 22/06/2020 21:32:49                       SABRITAS
## 1949         MX001 Abarrotes 21/06/2020 01:05:53                          PEPSI
## 1950         MX001 Abarrotes 22/06/2020 21:43:09                          HALLS
## 1951         MX001 Abarrotes 22/06/2020 21:43:44                           LALA
## 1952         MX001 Abarrotes 21/06/2020 01:06:36                          BIMBO
## 1953         MX001 Abarrotes 22/06/2020 21:46:15                COCA COLA LIGHT
## 1954         MX001 Abarrotes 21/06/2020 01:11:53                         SQUIRT
## 1955         MX001 Abarrotes 21/06/2020 01:12:41                       TOSTILEO
## 1956         MX001 Abarrotes 22/06/2020 21:47:57                          PEPSI
## 1957         MX001 Abarrotes 21/06/2020 01:12:41                    PAPIRRINGAS
## 1958         MX001 Abarrotes 22/06/2020 21:48:39                  MANZANITA SOL
## 1959         MX001 Abarrotes 21/06/2020 01:15:18                       MARLBORO
## 1960         MX001 Abarrotes 21/06/2020 01:22:11                           CIEL
## 1961         MX001 Abarrotes 22/06/2020 21:56:27                      COCA COLA
## 1962         MX001 Abarrotes 21/06/2020 01:23:44                        BOKADOS
## 1963         MX001 Abarrotes 21/06/2020 01:23:44                        BOKADOS
## 1964         MX001 Abarrotes 21/06/2020 01:23:44                        DORITOS
## 1965         MX001 Abarrotes 21/06/2020 01:23:44                       HOT NUTS
## 1966         MX001 Abarrotes 21/06/2020 01:23:44                    RANCHERITOS
## 1967         MX001 Abarrotes 21/06/2020 01:23:44                         BOGO´S
## 1968         MX001 Abarrotes 22/06/2020 21:57:21                        RUFFLES
## 1969         MX001 Abarrotes 22/06/2020 21:57:21                          PEPSI
## 1970         MX001 Abarrotes 21/06/2020 01:24:50                       GATORADE
## 1971         MX001 Abarrotes 22/06/2020 21:58:34                     TOPO CHICO
## 1972         MX001 Abarrotes 21/06/2020 01:25:29                          BIMBO
## 1973         MX001 Abarrotes 21/06/2020 01:25:43                         DANONE
## 1974         MX001 Abarrotes 22/06/2020 21:59:12                          WINIS
## 1975         MX001 Abarrotes 21/06/2020 01:26:17                         DANONE
## 1976         MX001 Abarrotes 21/06/2020 01:33:18                          PEPSI
## 1977         MX001 Abarrotes 22/06/2020 22:15:19              ARCOIRIS (GAMESA)
## 1978         MX001 Abarrotes 22/06/2020 22:18:31                          BIMBO
## 1979         MX001 Abarrotes 22/06/2020 22:18:31                           LALA
## 1980         MX001 Abarrotes 22/06/2020 22:18:31                         SPRITE
## 1981         MX001 Abarrotes 22/06/2020 22:20:58           MAZAPAN AZTECA (BK2)
## 1982         MX001 Abarrotes 22/06/2020 22:20:58                           LALA
## 1983         MX001 Abarrotes 21/06/2020 01:47:39                         DAN UP
## 1984         MX001 Abarrotes 22/06/2020 22:29:31                       SABRITAS
## 1985         MX001 Abarrotes 22/06/2020 22:30:38                       GATORADE
## 1986         MX001 Abarrotes 22/06/2020 22:30:38                          BIMBO
## 1987         MX001 Abarrotes 21/06/2020 01:51:46                      PALL MALL
## 1988         MX001 Abarrotes 22/06/2020 22:31:19                    SANTA CLARA
## 1989         MX001 Abarrotes 22/06/2020 22:31:19                         DANONE
## 1990         MX001 Abarrotes 22/06/2020 22:32:46                       DANONINO
## 1991         MX001 Abarrotes 22/06/2020 22:32:46                          EPURA
## 1992         MX001 Abarrotes 22/06/2020 22:32:46                         FRESCA
## 1993         MX001 Abarrotes 22/06/2020 22:33:28                       JARRITOS
## 1994         MX001 Abarrotes 22/06/2020 22:34:04                VELADORA MEXICO
## 1995         MX001 Abarrotes 22/06/2020 22:34:04                           LALA
## 1996         MX001 Abarrotes 22/06/2020 22:34:36                        KINDER 
## 1997         MX001 Abarrotes 21/06/2020 02:06:23                          FLASH
## 1998         MX001 Abarrotes 21/06/2020 02:06:23                       MARLBORO
## 1999         MX001 Abarrotes 22/06/2020 22:39:38                       MARINELA
## 2000         MX001 Abarrotes 21/06/2020 02:09:30                       POWERADE
## 2001         MX001 Abarrotes 21/06/2020 02:09:30                           LALA
## 2002         MX001 Abarrotes 21/06/2020 02:09:30                        CLAMATO
## 2003         MX001 Abarrotes 22/06/2020 22:39:38                           LINK
## 2004         MX001 Abarrotes 22/06/2020 22:39:48                      COCA COLA
## 2005         MX001 Abarrotes 21/06/2020 02:10:00                        KINDER 
## 2006         MX001 Abarrotes 22/06/2020 22:40:07                          BIMBO
## 2007         MX001 Abarrotes 21/06/2020 08:16:03                           LALA
## 2008         MX001 Abarrotes 21/06/2020 08:16:03                    5 ESTRELLAS
## 2009         MX001 Abarrotes 22/06/2020 22:40:52                        BOKADOS
## 2010         MX001 Abarrotes 21/06/2020 08:16:24                      COCA COLA
## 2011         MX001 Abarrotes 21/06/2020 08:16:45                      COCA COLA
## 2012         MX001 Abarrotes 21/06/2020 08:20:05                     TOPO CHICO
## 2013         MX001 Abarrotes 22/06/2020 22:41:30                          PEPSI
## 2014         MX001 Abarrotes 22/06/2020 22:41:45                        CHEETOS
## 2015         MX001 Abarrotes 22/06/2020 22:41:45                       SABRITAS
## 2016         MX001 Abarrotes 21/06/2020 08:27:57                    5 ESTRELLAS
## 2017         MX001 Abarrotes 21/06/2020 08:28:57                           JOYA
## 2018         MX001 Abarrotes 22/06/2020 22:42:43                           JOYA
## 2019         MX001 Abarrotes 21/06/2020 08:34:40                          DOWNY
## 2020         MX001 Abarrotes 21/06/2020 08:34:40                          PINOL
## 2021         MX001 Abarrotes 21/06/2020 08:34:40                          ARIEL
## 2022         MX001 Abarrotes 21/06/2020 08:34:40                    5 ESTRELLAS
## 2023         MX001 Abarrotes 21/06/2020 08:42:12                          PEPSI
## 2024         MX001 Abarrotes 21/06/2020 08:57:55                      COCA COLA
## 2025         MX001 Abarrotes 22/06/2020 22:45:17                          PEPSI
## 2026         MX001 Abarrotes 21/06/2020 09:02:17                      COCA COLA
## 2027         MX001 Abarrotes 22/06/2020 22:45:46                      COCA COLA
## 2028         MX001 Abarrotes 21/06/2020 09:04:11                       SABRITAS
## 2029         MX001 Abarrotes 21/06/2020 09:06:44                    NUTRI LECHE
## 2030         MX001 Abarrotes 22/06/2020 22:47:00                       PAKETAXO
## 2031         MX001 Abarrotes 22/06/2020 22:47:00                          BIMBO
## 2032         MX001 Abarrotes 22/06/2020 22:47:00                           LALA
## 2033         MX001 Abarrotes 21/06/2020 09:14:10                          PEPSI
## 2034         MX001 Abarrotes 22/06/2020 22:48:53                         MARIAS
## 2035         MX001 Abarrotes 22/06/2020 22:48:53              ARCOIRIS (GAMESA)
## 2036         MX001 Abarrotes 22/06/2020 22:48:53                           LALA
## 2037         MX001 Abarrotes 21/06/2020 09:20:32                      COCA COLA
## 2038         MX001 Abarrotes 22/06/2020 22:48:53                       FABULOSO
## 2039         MX001 Abarrotes 22/06/2020 22:49:27                         ACT II
## 2040         MX001 Abarrotes 22/06/2020 22:49:27                        POFFETS
## 2041         MX001 Abarrotes 22/06/2020 22:49:27                           LALA
## 2042         MX001 Abarrotes 22/06/2020 22:49:43                     TOPO CHICO
## 2043         MX001 Abarrotes 21/06/2020 09:23:12                      COCA COLA
## 2044         MX001 Abarrotes 21/06/2020 09:25:07                         TECATE
## 2045         MX001 Abarrotes 22/06/2020 23:50:17                        CHEETOS
## 2046         MX001 Abarrotes 21/06/2020 09:29:51                          PEPSI
## 2047         MX001 Abarrotes 21/06/2020 09:29:51                     CANADA DRY
## 2048         MX001 Abarrotes 22/06/2020 23:55:18                          PEPSI
## 2049         MX001 Abarrotes 21/06/2020 09:30:59                      COCA COLA
## 2050         MX001 Abarrotes 21/06/2020 09:41:51                         HERDEZ
## 2051         MX001 Abarrotes 22/06/2020 23:56:45                          ELITE
## 2052         MX001 Abarrotes 21/06/2020 09:41:51                          EPURA
## 2053         MX001 Abarrotes 22/06/2020 23:56:45                     KLEEN BEBE
## 2054         MX001 Abarrotes 21/06/2020 09:42:36                          PEPSI
## 2055         MX001 Abarrotes 22/06/2020 23:57:14                          PEPSI
## 2056         MX001 Abarrotes 22/06/2020 23:58:28                       GATORADE
## 2057         MX001 Abarrotes 21/06/2020 09:43:47                           LALA
## 2058         MX001 Abarrotes 21/06/2020 09:43:47                           LALA
## 2059         MX001 Abarrotes 21/06/2020 09:43:47                           LALA
## 2060         MX001 Abarrotes 23/06/2020 00:01:56                          PEPSI
## 2061         MX001 Abarrotes 21/06/2020 09:44:21                COCA COLA LIGHT
## 2062         MX001 Abarrotes 21/06/2020 09:44:21                      COCA COLA
## 2063         MX001 Abarrotes 23/06/2020 00:02:25                      COCA COLA
## 2064         MX001 Abarrotes 21/06/2020 09:45:15                          PEPSI
## 2065         MX001 Abarrotes 23/06/2020 00:05:29                  MANZANITA SOL
## 2066         MX001 Abarrotes 21/06/2020 09:45:52                       GILLETTE
## 2067         MX001 Abarrotes 23/06/2020 00:06:25                       MARINELA
## 2068         MX001 Abarrotes 23/06/2020 00:06:48                          BIMBO
## 2069         MX001 Abarrotes 21/06/2020 09:47:38                     TOPO CHICO
## 2070         MX001 Abarrotes 23/06/2020 00:07:32                       FRUTIMAX
## 2071         MX001 Abarrotes 23/06/2020 00:08:16                          PEPSI
## 2072         MX001 Abarrotes 23/06/2020 00:08:16                     LA LECHERA
## 2073         MX001 Abarrotes 21/06/2020 09:48:29                         SQUIRT
## 2074         MX001 Abarrotes 21/06/2020 09:53:59                           LINK
## 2075         MX001 Abarrotes 21/06/2020 09:54:19                          PEPSI
## 2076         MX001 Abarrotes 21/06/2020 09:54:42                      COCA COLA
## 2077         MX001 Abarrotes 23/06/2020 00:14:03                      ZUCARITAS
## 2078         MX001 Abarrotes 23/06/2020 00:14:03                      COCA COLA
## 2079         MX001 Abarrotes 21/06/2020 10:00:27                           LALA
## 2080         MX001 Abarrotes 23/06/2020 00:15:21                          PINOL
## 2081         MX001 Abarrotes 23/06/2020 00:15:21                          FLASH
## 2082         MX001 Abarrotes 21/06/2020 10:00:27                          BIMBO
## 2083         MX001 Abarrotes 21/06/2020 10:00:27                          PEPSI
## 2084         MX001 Abarrotes 21/06/2020 10:00:56                          PEPSI
## 2085         MX001 Abarrotes 23/06/2020 00:16:03                       MARLBORO
## 2086         MX001 Abarrotes 23/06/2020 00:16:24                      COCA COLA
## 2087         MX001 Abarrotes 21/06/2020 10:01:57                      COCA COLA
## 2088         MX001 Abarrotes 23/06/2020 00:17:08                           TANG
## 2089         MX001 Abarrotes 21/06/2020 10:07:22                          PEPSI
## 2090         MX001 Abarrotes 21/06/2020 10:09:00                          PEPSI
## 2091         MX001 Abarrotes 23/06/2020 08:43:40                     TOPO CHICO
## 2092         MX001 Abarrotes 23/06/2020 08:43:40                          PEPSI
## 2093         MX001 Abarrotes 21/06/2020 10:11:21                          EPURA
## 2094         MX001 Abarrotes 21/06/2020 10:12:35                    NUTRI LECHE
## 2095         MX001 Abarrotes 21/06/2020 10:12:35                COCA COLA LIGHT
## 2096         MX001 Abarrotes 21/06/2020 10:12:35                      COCA COLA
## 2097         MX001 Abarrotes 21/06/2020 10:12:55                           LINK
## 2098         MX001 Abarrotes 21/06/2020 10:14:52                    NUTRI LECHE
## 2099         MX001 Abarrotes 23/06/2020 09:39:01                          EPURA
## 2100         MX001 Abarrotes 23/06/2020 09:40:29                          PEPSI
## 2101         MX001 Abarrotes 21/06/2020 10:15:44                  VARIOS DANONE
## 2102         MX001 Abarrotes 21/06/2020 10:17:45     BLANCA NIEVES (DETERGENTE)
## 2103         MX001 Abarrotes 23/06/2020 09:44:05                      COCA COLA
## 2104         MX001 Abarrotes 23/06/2020 09:44:17                       PAKETAXO
## 2105         MX001 Abarrotes 21/06/2020 10:26:36                       POWERADE
## 2106         MX001 Abarrotes 23/06/2020 09:47:12                      COCA COLA
## 2107         MX001 Abarrotes 23/06/2020 09:49:03                           SABA
## 2108         MX001 Abarrotes 21/06/2020 10:33:04                          PEPSI
## 2109         MX001 Abarrotes 21/06/2020 10:35:15                      COCA COLA
## 2110         MX001 Abarrotes 21/06/2020 10:37:23                       SEVEN UP
## 2111         MX001 Abarrotes 21/06/2020 10:40:03                    NUTRI LECHE
## 2112         MX001 Abarrotes 21/06/2020 10:44:27                           GIRO
## 2113         MX001 Abarrotes 21/06/2020 10:44:27                      COCA COLA
## 2114         MX001 Abarrotes 21/06/2020 10:46:18       CLAMATO VUELVE A LA VIDA
## 2115         MX001 Abarrotes 23/06/2020 10:15:04                           JOYA
## 2116         MX001 Abarrotes 21/06/2020 10:47:30                      COCA COLA
## 2117         MX001 Abarrotes 23/06/2020 10:43:38                      COCA COLA
## 2118         MX001 Abarrotes 23/06/2020 10:43:38                          FLAMA
## 2119         MX001 Abarrotes 23/06/2020 10:51:36                       CLORALEX
## 2120         MX001 Abarrotes 23/06/2020 10:51:36                          FLASH
## 2121         MX001 Abarrotes 23/06/2020 10:51:36                        ENSUEÑO
## 2122         MX001 Abarrotes 23/06/2020 10:51:36                           FOCA
## 2123         MX001 Abarrotes 23/06/2020 10:51:36                       FRUTIMAX
## 2124         MX001 Abarrotes 21/06/2020 10:51:49                          JUMEX
## 2125         MX001 Abarrotes 23/06/2020 10:52:03                       FRUTIMAX
## 2126         MX001 Abarrotes 21/06/2020 10:52:58                       POWERADE
## 2127         MX001 Abarrotes 21/06/2020 10:52:58                           LALA
## 2128         MX001 Abarrotes 21/06/2020 10:57:12                          SALVO
## 2129         MX001 Abarrotes 21/06/2020 10:57:12                          KNORR
## 2130         MX001 Abarrotes 23/06/2020 10:57:41                          PEPSI
## 2131         MX001 Abarrotes 23/06/2020 10:58:07                         FRITOS
## 2132         MX001 Abarrotes 21/06/2020 11:03:03                     SABRITONES
## 2133         MX001 Abarrotes 23/06/2020 10:58:54                           LALA
## 2134         MX001 Abarrotes 23/06/2020 11:03:08                           LALA
## 2135         MX001 Abarrotes 21/06/2020 11:04:44                  MANZANITA SOL
## 2136         MX001 Abarrotes 21/06/2020 11:05:40                      COCA COLA
## 2137         MX001 Abarrotes 23/06/2020 11:15:30                          PEPSI
## 2138         MX001 Abarrotes 23/06/2020 11:16:04                        CHEETOS
## 2139         MX001 Abarrotes 23/06/2020 11:17:07                      COCA COLA
## 2140         MX001 Abarrotes 21/06/2020 11:07:12                           JOYA
## 2141         MX001 Abarrotes 23/06/2020 11:21:35                      LA SIERRA
## 2142         MX001 Abarrotes 23/06/2020 11:21:35                      COCA COLA
## 2143         MX001 Abarrotes 23/06/2020 11:24:28                          PEPSI
## 2144         MX001 Abarrotes 21/06/2020 11:08:55                           JOYA
## 2145         MX001 Abarrotes 23/06/2020 11:25:08                        KINDER 
## 2146         MX001 Abarrotes 23/06/2020 11:25:42                       MARINELA
## 2147         MX001 Abarrotes 21/06/2020 11:12:09                       HERSHEYS
## 2148         MX001 Abarrotes 21/06/2020 11:12:09                    SANTA CLARA
## 2149         MX001 Abarrotes 23/06/2020 11:30:16                          PEPSI
## 2150         MX001 Abarrotes 21/06/2020 11:16:33                          FANTA
## 2151         MX001 Abarrotes 21/06/2020 11:19:40                       MARINELA
## 2152         MX001 Abarrotes 21/06/2020 11:19:40                           LALA
## 2153         MX001 Abarrotes 23/06/2020 11:34:37                           TANG
## 2154         MX001 Abarrotes 21/06/2020 11:20:20                        ENSUEÑO
## 2155         MX001 Abarrotes 21/06/2020 11:20:20                           FOCA
## 2156         MX001 Abarrotes 23/06/2020 11:35:04               PRODUCTOS CIERVO
## 2157         MX001 Abarrotes 23/06/2020 11:35:18                        CHEETOS
## 2158         MX001 Abarrotes 21/06/2020 11:21:18                        RUFFLES
## 2159         MX001 Abarrotes 21/06/2020 11:21:18                          BIMBO
## 2160         MX001 Abarrotes 21/06/2020 11:21:18                          BIMBO
## 2161         MX001 Abarrotes 23/06/2020 11:36:17                      COCA COLA
## 2162         MX001 Abarrotes 23/06/2020 11:39:40                      CONSOMATE
## 2163         MX001 Abarrotes 23/06/2020 11:39:40                     DEL FUERTE
## 2164         MX001 Abarrotes 23/06/2020 11:43:24                           LINK
## 2165         MX001 Abarrotes 23/06/2020 11:43:35                           LALA
## 2166         MX001 Abarrotes 21/06/2020 11:25:45                         TECATE
## 2167         MX001 Abarrotes 23/06/2020 11:44:13     BLANCA NIEVES (DETERGENTE)
## 2168         MX001 Abarrotes 23/06/2020 11:44:13                           LALA
## 2169         MX001 Abarrotes 23/06/2020 11:44:13                  MANZANITA SOL
## 2170         MX001 Abarrotes 23/06/2020 11:44:13                       SUAVITEL
## 2171         MX001 Abarrotes 21/06/2020 11:28:12                          PEPSI
## 2172         MX001 Abarrotes 23/06/2020 11:49:10                      COCA COLA
## 2173         MX001 Abarrotes 23/06/2020 11:49:10                       MARINELA
## 2174         MX001 Abarrotes 23/06/2020 11:49:10                       SABRITAS
## 2175         MX001 Abarrotes 23/06/2020 11:49:33     BLANCA NIEVES (DETERGENTE)
## 2176         MX001 Abarrotes 23/06/2020 11:49:33                           INCA
## 2177         MX001 Abarrotes 21/06/2020 11:31:43                      COCA COLA
## 2178         MX001 Abarrotes 21/06/2020 11:32:21                          PEPSI
## 2179         MX001 Abarrotes 23/06/2020 11:57:03                           VOLT
## 2180         MX001 Abarrotes 21/06/2020 11:33:13                           LALA
## 2181         MX001 Abarrotes 23/06/2020 12:00:14                         ACT II
## 2182         MX001 Abarrotes 23/06/2020 12:00:14                            ACE
## 2183         MX001 Abarrotes 23/06/2020 12:00:14                       CRUJITOS
## 2184         MX001 Abarrotes 21/06/2020 11:33:31                COCA COLA LIGHT
## 2185         MX001 Abarrotes 23/06/2020 12:00:14                      CONSOMATE
## 2186         MX001 Abarrotes 23/06/2020 12:01:47                          BIMBO
## 2187         MX001 Abarrotes 23/06/2020 12:01:47                      COCA COLA
## 2188         MX001 Abarrotes 21/06/2020 11:35:30                     TOPO CHICO
## 2189         MX001 Abarrotes 23/06/2020 12:02:36                          PEPSI
## 2190         MX001 Abarrotes 23/06/2020 12:02:36                        KINDER 
## 2191         MX001 Abarrotes 23/06/2020 12:03:33                           ZOTE
## 2192         MX001 Abarrotes 23/06/2020 12:03:33                          PEPSI
## 2193         MX001 Abarrotes 23/06/2020 12:03:33                    NUTRI LECHE
## 2194         MX001 Abarrotes 23/06/2020 12:03:33                      DEL VALLE
## 2195         MX001 Abarrotes 23/06/2020 12:03:59                          REXAL
## 2196         MX001 Abarrotes 21/06/2020 11:39:43                  NESCAFE DECAF
## 2197         MX001 Abarrotes 21/06/2020 11:40:03                      COCA COLA
## 2198         MX001 Abarrotes 21/06/2020 11:41:11                      COCA COLA
## 2199         MX001 Abarrotes 21/06/2020 11:41:11                           LALA
## 2200         MX001 Abarrotes 23/06/2020 12:06:56                        ISADORA
## 2201         MX001 Abarrotes 21/06/2020 11:41:38                          PEPSI
## 2202         MX001 Abarrotes 23/06/2020 12:09:05                       GILLETTE
## 2203         MX001 Abarrotes 21/06/2020 11:42:19                         NEVADA
## 2204         MX001 Abarrotes 21/06/2020 11:47:32                          PEPSI
## 2205         MX001 Abarrotes 23/06/2020 12:14:52                          PEPSI
## 2206         MX001 Abarrotes 23/06/2020 12:15:48                        DORITOS
## 2207         MX001 Abarrotes 23/06/2020 12:15:48                        CHEETOS
## 2208         MX001 Abarrotes 23/06/2020 12:15:48                      COCA COLA
## 2209         MX001 Abarrotes 21/06/2020 11:48:04                      COCA COLA
## 2210         MX001 Abarrotes 21/06/2020 11:48:59                          PEPSI
## 2211         MX001 Abarrotes 23/06/2020 12:28:15                       CLORALEX
## 2212         MX001 Abarrotes 21/06/2020 11:50:33                    NUTRI LECHE
## 2213         MX001 Abarrotes 23/06/2020 12:28:15                          PINOL
## 2214         MX001 Abarrotes 21/06/2020 11:50:33                          PEPSI
## 2215         MX001 Abarrotes 21/06/2020 11:52:26                          PEPSI
## 2216         MX001 Abarrotes 23/06/2020 12:41:20                      COCA COLA
## 2217         MX001 Abarrotes 21/06/2020 11:53:19                      CONVERMEX
## 2218         MX001 Abarrotes 21/06/2020 11:53:19                      COCA COLA
## 2219         MX001 Abarrotes 21/06/2020 11:53:19                           JOYA
## 2220         MX001 Abarrotes 21/06/2020 11:53:19                 COCA COLA ZERO
## 2221         MX001 Abarrotes 21/06/2020 11:53:19                      CONVERMEX
## 2222         MX001 Abarrotes 21/06/2020 11:53:57                       GATORADE
## 2223         MX001 Abarrotes 23/06/2020 12:43:41                          PEPSI
## 2224         MX001 Abarrotes 21/06/2020 11:54:17                      COCA COLA
## 2225         MX001 Abarrotes 21/06/2020 11:54:17                 COCA COLA ZERO
## 2226         MX001 Abarrotes 21/06/2020 11:54:57                       MARINELA
## 2227         MX001 Abarrotes 21/06/2020 11:54:57                          EPURA
## 2228         MX001 Abarrotes 21/06/2020 11:55:16                     BLUE HOUSE
## 2229         MX001 Abarrotes 23/06/2020 12:51:06                        RUFFLES
## 2230         MX001 Abarrotes 23/06/2020 12:51:06                        DORITOS
## 2231         MX001 Abarrotes 23/06/2020 12:51:06                        CHEETOS
## 2232         MX001 Abarrotes 23/06/2020 12:51:06                          KNORR
## 2233         MX001 Abarrotes 23/06/2020 12:51:06                    RANCHERITOS
## 2234         MX001 Abarrotes 23/06/2020 12:51:06                          PEPSI
## 2235         MX001 Abarrotes 23/06/2020 12:51:58                    RANCH STYLE
## 2236         MX001 Abarrotes 21/06/2020 11:57:55                     TOPO CHICO
## 2237         MX001 Abarrotes 23/06/2020 12:52:38                           JOYA
## 2238         MX001 Abarrotes 21/06/2020 11:57:55                      DEL VALLE
## 2239         MX001 Abarrotes 21/06/2020 11:58:29                          FLAMA
## 2240         MX001 Abarrotes 23/06/2020 12:53:38                      COCA COLA
## 2241         MX001 Abarrotes 23/06/2020 12:53:38                      COCA COLA
## 2242         MX001 Abarrotes 21/06/2020 11:59:05                  TOPITOS (BK2)
## 2243         MX001 Abarrotes 21/06/2020 11:59:05                        RUFFLES
## 2244         MX001 Abarrotes 21/06/2020 11:59:05                          PEPSI
## 2245         MX001 Abarrotes 21/06/2020 11:59:05                         FRESCA
## 2246         MX001 Abarrotes 23/06/2020 12:55:30                          BIMBO
## 2247         MX001 Abarrotes 21/06/2020 11:59:26                       SUAVITEL
## 2248         MX001 Abarrotes 21/06/2020 12:03:03                      COCA COLA
## 2249         MX001 Abarrotes 21/06/2020 12:03:19                          PEPSI
## 2250         MX001 Abarrotes 21/06/2020 12:03:57                          ELITE
## 2251         MX001 Abarrotes 21/06/2020 12:04:24                      COCA COLA
## 2252         MX001 Abarrotes 21/06/2020 12:04:56                      COCA COLA
## 2253         MX001 Abarrotes 23/06/2020 13:10:34                       PEDIGREE
## 2254         MX001 Abarrotes 23/06/2020 13:10:34                          FLAMA
## 2255         MX001 Abarrotes 23/06/2020 13:11:38                      DEL MONTE
## 2256         MX001 Abarrotes 21/06/2020 12:07:14                          FANTA
## 2257         MX001 Abarrotes 23/06/2020 13:12:44                      COCA COLA
## 2258         MX001 Abarrotes 21/06/2020 12:07:36                       PEDIGREE
## 2259         MX001 Abarrotes 21/06/2020 12:09:17                       KARTAMUS
## 2260         MX001 Abarrotes 21/06/2020 12:11:29                  VARIOS DANONE
## 2261         MX001 Abarrotes 21/06/2020 12:11:51                       TOSTILEO
## 2262         MX001 Abarrotes 23/06/2020 13:37:45                     LA COSTEÑA
## 2263         MX001 Abarrotes 23/06/2020 13:37:45                    5 ESTRELLAS
## 2264         MX001 Abarrotes 23/06/2020 13:38:28                       MARUCHAN
## 2265         MX001 Abarrotes 21/06/2020 12:14:09               PEÑAFIEL SABORES
## 2266         MX001 Abarrotes 21/06/2020 12:14:09                      LA SIERRA
## 2267         MX001 Abarrotes 23/06/2020 13:45:31                        LA FINA
## 2268         MX001 Abarrotes 23/06/2020 13:45:31                     DOÑA MARIA
## 2269         MX001 Abarrotes 23/06/2020 13:45:31                      CONSOMATE
## 2270         MX001 Abarrotes 21/06/2020 12:14:40                        KINDER 
## 2271         MX001 Abarrotes 23/06/2020 13:45:47                      CONVERMEX
## 2272         MX001 Abarrotes 21/06/2020 12:16:23                     TOPO CHICO
## 2273         MX001 Abarrotes 21/06/2020 12:17:18                           JOYA
## 2274         MX001 Abarrotes 23/06/2020 13:52:36                        PREMIER
## 2275         MX001 Abarrotes 21/06/2020 12:21:34                      COCA COLA
## 2276         MX001 Abarrotes 23/06/2020 13:54:29                          BIMBO
## 2277         MX001 Abarrotes 21/06/2020 12:21:56                      DEL MONTE
## 2278         MX001 Abarrotes 23/06/2020 14:07:14                     BLUE HOUSE
## 2279         MX001 Abarrotes 23/06/2020 14:08:48                    NUTRI LECHE
## 2280         MX001 Abarrotes 21/06/2020 12:28:07                      COCA COLA
## 2281         MX001 Abarrotes 23/06/2020 14:10:21                          PEPSI
## 2282         MX001 Abarrotes 23/06/2020 14:11:11             SALADITAS (GAMESA)
## 2283         MX001 Abarrotes 21/06/2020 12:30:09                          BIMBO
## 2284         MX001 Abarrotes 23/06/2020 14:12:02                          PEPSI
## 2285         MX001 Abarrotes 21/06/2020 12:30:09                      COCA COLA
## 2286         MX001 Abarrotes 23/06/2020 14:15:09                BENSON & HEDGES
## 2287         MX001 Abarrotes 21/06/2020 12:30:56                          PEPSI
## 2288         MX001 Abarrotes 21/06/2020 12:34:40                       CLORALEX
## 2289         MX001 Abarrotes 21/06/2020 12:34:40                           INCA
## 2290         MX001 Abarrotes 23/06/2020 16:04:03                      COCA COLA
## 2291         MX001 Abarrotes 23/06/2020 16:05:09                        CHEETOS
## 2292         MX001 Abarrotes 23/06/2020 16:05:09                    RANCHERITOS
## 2293         MX001 Abarrotes 21/06/2020 12:37:28                      COCA COLA
## 2294         MX001 Abarrotes 23/06/2020 16:05:09                 COCA COLA ZERO
## 2295         MX001 Abarrotes 21/06/2020 12:37:55                          PEPSI
## 2296         MX001 Abarrotes 23/06/2020 17:02:30                     VALLE FRUT
## 2297         MX001 Abarrotes 23/06/2020 17:04:44                          PEPSI
## 2298         MX001 Abarrotes 21/06/2020 13:00:23                      CONVERMEX
## 2299         MX001 Abarrotes 21/06/2020 13:00:23                      CONVERMEX
## 2300         MX001 Abarrotes 21/06/2020 13:05:08                       CLORALEX
## 2301         MX001 Abarrotes 21/06/2020 13:05:08                          FLASH
## 2302         MX001 Abarrotes 21/06/2020 13:08:57                     VALLE FRUT
## 2303         MX001 Abarrotes 23/06/2020 17:22:49                      NORTEÑITA
## 2304         MX001 Abarrotes 23/06/2020 17:24:20                          BIMBO
## 2305         MX001 Abarrotes 23/06/2020 17:24:20                      COCA COLA
## 2306         MX001 Abarrotes 21/06/2020 13:43:24                      COCA COLA
## 2307         MX001 Abarrotes 21/06/2020 13:43:24                          PICOT
## 2308         MX001 Abarrotes 21/06/2020 13:48:58                       FABULOSO
## 2309         MX001 Abarrotes 23/06/2020 17:27:42                       MARLBORO
## 2310         MX001 Abarrotes 21/06/2020 13:48:58                       COLGATE 
## 2311         MX001 Abarrotes 23/06/2020 17:30:11                         SQUIRT
## 2312         MX001 Abarrotes 21/06/2020 13:51:11                       MARINELA
## 2313         MX001 Abarrotes 23/06/2020 17:30:58                      COCA COLA
## 2314         MX001 Abarrotes 23/06/2020 17:48:13                        RUFFLES
## 2315         MX001 Abarrotes 23/06/2020 17:48:13                        DORITOS
## 2316         MX001 Abarrotes 21/06/2020 13:55:17                           LALA
## 2317         MX001 Abarrotes 21/06/2020 13:55:17                       MARINELA
## 2318         MX001 Abarrotes 23/06/2020 17:59:29                       PAKETAXO
## 2319         MX001 Abarrotes 23/06/2020 17:59:29                     DEL FUERTE
## 2320         MX001 Abarrotes 23/06/2020 19:00:38                EL GALLO DE ORO
## 2321         MX001 Abarrotes 21/06/2020 14:00:29                       BONAFONT
## 2322         MX001 Abarrotes 23/06/2020 20:00:54                      COCA COLA
## 2323         MX001 Abarrotes 23/06/2020 20:00:54                        ISADORA
## 2324         MX001 Abarrotes 23/06/2020 20:07:18                       MARUCHAN
## 2325         MX001 Abarrotes 21/06/2020 14:02:28                       POWERADE
## 2326         MX001 Abarrotes 21/06/2020 14:02:45                          JUMEX
## 2327         MX001 Abarrotes 23/06/2020 20:10:53                           TANG
## 2328         MX001 Abarrotes 21/06/2020 14:10:47                          PEPSI
## 2329         MX001 Abarrotes 21/06/2020 14:10:47                           JOYA
## 2330         MX001 Abarrotes 21/06/2020 14:13:20                       POWERADE
## 2331         MX001 Abarrotes 21/06/2020 14:14:34                          BIMBO
## 2332         MX001 Abarrotes 23/06/2020 20:32:57                  MANZANITA SOL
## 2333         MX001 Abarrotes 23/06/2020 20:33:33                       PEDIGREE
## 2334         MX001 Abarrotes 23/06/2020 20:34:56                       MARUCHAN
## 2335         MX001 Abarrotes 23/06/2020 20:41:50                       PAKETAXO
## 2336         MX001 Abarrotes 23/06/2020 20:42:16                          GOLOS
## 2337         MX001 Abarrotes 23/06/2020 20:42:16                       SABRITAS
## 2338         MX001 Abarrotes 23/06/2020 20:42:16                          PULPY
## 2339         MX001 Abarrotes 21/06/2020 14:20:11                          PEPSI
## 2340         MX001 Abarrotes 21/06/2020 14:27:23                        FRUTZZO
## 2341         MX001 Abarrotes 21/06/2020 14:27:23                         SQUIRT
## 2342         MX001 Abarrotes 21/06/2020 14:27:23                      CONVERMEX
## 2343         MX001 Abarrotes 21/06/2020 14:27:23                      CONVERMEX
## 2344         MX001 Abarrotes 21/06/2020 14:41:04                        ENCANTO
## 2345         MX001 Abarrotes 21/06/2020 14:41:04                        DORITOS
## 2346         MX001 Abarrotes 21/06/2020 14:42:55                      COCA COLA
## 2347         MX001 Abarrotes 23/06/2020 21:00:07                          PEPSI
## 2348         MX001 Abarrotes 23/06/2020 21:00:07                       BONAFONT
## 2349         MX001 Abarrotes 23/06/2020 21:05:36                      COCA COLA
## 2350         MX001 Abarrotes 21/06/2020 14:46:37                     TOPO CHICO
## 2351         MX001 Abarrotes 21/06/2020 14:46:37                        CAMELIA
## 2352         MX001 Abarrotes 21/06/2020 14:46:37                      COCA COLA
## 2353         MX001 Abarrotes 21/06/2020 14:47:19                    LA BOTANERA
## 2354         MX001 Abarrotes 23/06/2020 21:19:43                      COCA COLA
## 2355         MX001 Abarrotes 21/06/2020 14:47:56              EMPERADOR (SENZO)
## 2356         MX001 Abarrotes 23/06/2020 21:33:04                       GATORADE
## 2357         MX001 Abarrotes 23/06/2020 21:33:04                        KINDER 
## 2358         MX001 Abarrotes 21/06/2020 14:48:49                        CHEETOS
## 2359         MX001 Abarrotes 21/06/2020 14:49:28                      COCA COLA
## 2360         MX001 Abarrotes 23/06/2020 21:35:45                        KLEENEX
## 2361         MX001 Abarrotes 23/06/2020 21:39:22                      COCA COLA
## 2362         MX001 Abarrotes 21/06/2020 14:52:13                        RUFFLES
## 2363         MX001 Abarrotes 23/06/2020 21:40:16                           LALA
## 2364         MX001 Abarrotes 21/06/2020 14:52:48                       TOSTITOS
## 2365         MX001 Abarrotes 21/06/2020 14:52:48                        DORITOS
## 2366         MX001 Abarrotes 21/06/2020 14:52:48                       SABRITAS
## 2367         MX001 Abarrotes 21/06/2020 14:54:53                      COCA COLA
## 2368         MX001 Abarrotes 21/06/2020 14:54:53                         TECATE
## 2369         MX001 Abarrotes 21/06/2020 15:01:16               CARNATION CLAVEL
## 2370         MX001 Abarrotes 23/06/2020 21:48:31                          PEPSI
## 2371         MX001 Abarrotes 23/06/2020 21:49:10                     TOPO CHICO
## 2372         MX001 Abarrotes 23/06/2020 21:49:10                        RUFFLES
## 2373         MX001 Abarrotes 23/06/2020 21:49:10                          JUMEX
## 2374         MX001 Abarrotes 23/06/2020 21:50:03                           LALA
## 2375         MX001 Abarrotes 21/06/2020 15:05:42                        YOPLAIT
## 2376         MX001 Abarrotes 23/06/2020 21:51:07                      NORTEÑITA
## 2377         MX001 Abarrotes 21/06/2020 15:06:51                        DORITOS
## 2378         MX001 Abarrotes 21/06/2020 15:06:51                          PEPSI
## 2379         MX001 Abarrotes 23/06/2020 21:54:44                     TOPO CHICO
## 2380         MX001 Abarrotes 21/06/2020 15:09:20                           VOLT
## 2381         MX001 Abarrotes 21/06/2020 15:11:00                       SABRITAS
## 2382         MX001 Abarrotes 23/06/2020 21:58:22                          PEPSI
## 2383         MX001 Abarrotes 23/06/2020 21:58:22                        CRISTAL
## 2384         MX001 Abarrotes 21/06/2020 15:11:00                           ZOTE
## 2385         MX001 Abarrotes 23/06/2020 21:58:48                          BIMBO
## 2386         MX001 Abarrotes 23/06/2020 21:58:48                       PAKETAXO
## 2387         MX001 Abarrotes 23/06/2020 21:58:48                          BIMBO
## 2388         MX001 Abarrotes 23/06/2020 21:59:49                       TIA ROSA
## 2389         MX001 Abarrotes 23/06/2020 21:59:49                           LARA
## 2390         MX001 Abarrotes 23/06/2020 21:59:49                          GUTEN
## 2391         MX001 Abarrotes 23/06/2020 21:59:49                      COCA COLA
## 2392         MX001 Abarrotes 21/06/2020 15:20:14                           LINK
## 2393         MX001 Abarrotes 21/06/2020 15:21:12                        CLAMATO
## 2394         MX001 Abarrotes 21/06/2020 15:21:12                BENSON & HEDGES
## 2395         MX001 Abarrotes 21/06/2020 15:21:12                       SABRITAS
## 2396         MX001 Abarrotes 23/06/2020 22:12:56                COCA COLA LIGHT
## 2397         MX001 Abarrotes 21/06/2020 15:23:29                      COCA COLA
## 2398         MX001 Abarrotes 23/06/2020 22:12:56                           JOYA
## 2399         MX001 Abarrotes 23/06/2020 22:14:49                       MARUCHAN
## 2400         MX001 Abarrotes 23/06/2020 22:14:49                       MARUCHAN
## 2401         MX001 Abarrotes 23/06/2020 22:14:49                          BIMBO
## 2402         MX001 Abarrotes 23/06/2020 22:15:22                       MARLBORO
## 2403         MX001 Abarrotes 23/06/2020 22:17:55                      COCA COLA
## 2404         MX001 Abarrotes 23/06/2020 22:19:41                        RUFFLES
## 2405         MX001 Abarrotes 23/06/2020 22:19:41                        DORITOS
## 2406         MX001 Abarrotes 23/06/2020 22:19:41                      LA SIERRA
## 2407         MX001 Abarrotes 23/06/2020 22:19:41                       POWERADE
## 2408         MX001 Abarrotes 21/06/2020 15:27:09                      MCCORMICK
## 2409         MX001 Abarrotes 21/06/2020 15:27:09                       JARRITOS
## 2410         MX001 Abarrotes 21/06/2020 15:27:43                       PAKETAXO
## 2411         MX001 Abarrotes 23/06/2020 22:26:30                       PAKETAXO
## 2412         MX001 Abarrotes 23/06/2020 22:26:30                          PEPSI
## 2413         MX001 Abarrotes 21/06/2020 15:27:43                     CHURRUMAIS
## 2414         MX001 Abarrotes 23/06/2020 22:29:25                       MARUCHAN
## 2415         MX001 Abarrotes 23/06/2020 22:29:25                      COCA COLA
## 2416         MX001 Abarrotes 21/06/2020 15:28:25                        CHEETOS
## 2417         MX001 Abarrotes 21/06/2020 15:28:25                     CHURRUMAIS
## 2418         MX001 Abarrotes 21/06/2020 15:28:43                        CHEETOS
## 2419         MX001 Abarrotes 21/06/2020 15:28:43                        CHEETOS
## 2420         MX001 Abarrotes 23/06/2020 22:31:17                          BIMBO
## 2421         MX001 Abarrotes 23/06/2020 22:31:17               LECHE FORTILECHE
## 2422         MX001 Abarrotes 21/06/2020 15:28:58                      COCA COLA
## 2423         MX001 Abarrotes 21/06/2020 15:29:54                          GOLOS
## 2424         MX001 Abarrotes 21/06/2020 15:29:54              TRIDENT XTRA CARE
## 2425         MX001 Abarrotes 21/06/2020 15:32:53                          PEPSI
## 2426         MX001 Abarrotes 21/06/2020 15:34:13                      PAPATINAS
## 2427         MX001 Abarrotes 21/06/2020 15:34:13                      COCA COLA
## 2428         MX001 Abarrotes 23/06/2020 22:37:19                           IRIS
## 2429         MX001 Abarrotes 23/06/2020 22:37:58                          BIMBO
## 2430         MX001 Abarrotes 23/06/2020 22:37:58                           LALA
## 2431         MX001 Abarrotes 21/06/2020 15:35:09                          PEPSI
## 2432         MX001 Abarrotes 23/06/2020 22:40:43                          PEPSI
## 2433         MX001 Abarrotes 21/06/2020 15:38:11                       SEVEN UP
## 2434         MX001 Abarrotes 21/06/2020 15:38:11                          PEPSI
## 2435         MX001 Abarrotes 23/06/2020 22:41:06                           TANG
## 2436         MX001 Abarrotes 21/06/2020 15:38:52                    VERDE VALLE
## 2437         MX001 Abarrotes 21/06/2020 15:40:02              EMPERADOR (SENZO)
## 2438         MX001 Abarrotes 23/06/2020 22:42:32                        TRIDENT
## 2439         MX001 Abarrotes 21/06/2020 15:40:33                      COCA COLA
## 2440         MX001 Abarrotes 23/06/2020 22:44:05                         NESTLE
## 2441         MX001 Abarrotes 23/06/2020 22:44:05                          AVANT
## 2442         MX001 Abarrotes 21/06/2020 15:43:14                       TOSTITOS
## 2443         MX001 Abarrotes 21/06/2020 15:43:14                           LALA
## 2444         MX001 Abarrotes 23/06/2020 22:47:21                        BOKADOS
## 2445         MX001 Abarrotes 23/06/2020 22:47:21                        CHEETOS
## 2446         MX001 Abarrotes 21/06/2020 15:45:46                          REXAL
## 2447         MX001 Abarrotes 23/06/2020 22:47:35                          PEPSI
## 2448         MX001 Abarrotes 21/06/2020 15:48:05              ARCOIRIS (GAMESA)
## 2449         MX001 Abarrotes 21/06/2020 15:48:05                     DEL FUERTE
## 2450         MX001 Abarrotes 21/06/2020 15:48:05                    SANTA CLARA
## 2451         MX001 Abarrotes 23/06/2020 22:57:47                           LALA
## 2452         MX001 Abarrotes 23/06/2020 22:57:47                       COLGATE 
## 2453         MX001 Abarrotes 23/06/2020 22:57:47                            AXE
## 2454         MX001 Abarrotes 21/06/2020 15:48:56                         NEVADA
## 2455         MX001 Abarrotes 23/06/2020 23:29:20                          PEPSI
## 2456         MX001 Abarrotes 23/06/2020 23:30:45                         NESTLE
## 2457         MX001 Abarrotes 21/06/2020 15:53:17                      CONVERMEX
## 2458         MX001 Abarrotes 21/06/2020 15:53:17                      CONVERMEX
## 2459         MX001 Abarrotes 23/06/2020 23:30:45                     CHOCO MILK
## 2460         MX001 Abarrotes 21/06/2020 15:55:11                         ACT II
## 2461         MX001 Abarrotes 21/06/2020 15:55:11                       SABRITAS
## 2462         MX001 Abarrotes 23/06/2020 23:32:58                        CAMELIA
## 2463         MX001 Abarrotes 23/06/2020 23:32:58                       POWERADE
## 2464         MX001 Abarrotes 21/06/2020 15:57:02                          BIMBO
## 2465         MX001 Abarrotes 23/06/2020 23:34:57                            SOL
## 2466         MX001 Abarrotes 23/06/2020 23:35:22                       MARLBORO
## 2467         MX001 Abarrotes 21/06/2020 16:54:54                           LALA
## 2468         MX001 Abarrotes 23/06/2020 23:36:17                       PAKETAXO
## 2469         MX001 Abarrotes 23/06/2020 23:36:17                          PEPSI
## 2470         MX001 Abarrotes 23/06/2020 23:36:17                          ELITE
## 2471         MX001 Abarrotes 21/06/2020 16:57:08                          PEPSI
## 2472         MX001 Abarrotes 23/06/2020 23:36:45                       TOSTITOS
## 2473         MX001 Abarrotes 21/06/2020 16:57:08                       DIAMANTE
## 2474         MX001 Abarrotes 21/06/2020 16:57:08                    5 ESTRELLAS
## 2475         MX001 Abarrotes 21/06/2020 16:58:47                        BOKADOS
## 2476         MX001 Abarrotes 21/06/2020 16:58:47              EMPERADOR (SENZO)
## 2477         MX001 Abarrotes 21/06/2020 16:58:47                       SABRITAS
## 2478         MX001 Abarrotes 21/06/2020 16:58:47                        RUFFLES
## 2479         MX001 Abarrotes 21/06/2020 16:58:47                      COCA COLA
## 2480         MX001 Abarrotes 23/06/2020 23:40:02                    NUTRI LECHE
## 2481         MX001 Abarrotes 21/06/2020 16:58:47                         BOGO´S
## 2482         MX001 Abarrotes 21/06/2020 16:59:49                      COCA COLA
## 2483         MX001 Abarrotes 21/06/2020 17:00:22                          PEPSI
## 2484         MX001 Abarrotes 23/06/2020 23:43:55                           LALA
## 2485         MX001 Abarrotes 21/06/2020 17:01:56                       MARUCHAN
## 2486         MX001 Abarrotes 23/06/2020 23:46:04              ARCOIRIS (GAMESA)
## 2487         MX001 Abarrotes 23/06/2020 23:46:04                      ZUCARITAS
## 2488         MX001 Abarrotes 23/06/2020 23:46:04                           LALA
## 2489         MX001 Abarrotes 23/06/2020 23:46:04                       MARUCHAN
## 2490         MX001 Abarrotes 23/06/2020 23:46:04                      DEL VALLE
## 2491         MX001 Abarrotes 23/06/2020 23:47:07                BENSON & HEDGES
## 2492         MX001 Abarrotes 21/06/2020 17:04:42                        BOKADOS
## 2493         MX001 Abarrotes 21/06/2020 17:04:53                       JARRITOS
## 2494         MX001 Abarrotes 23/06/2020 23:48:41                      VALENTINA
## 2495         MX001 Abarrotes 23/06/2020 23:48:41                      COCA COLA
## 2496         MX001 Abarrotes 21/06/2020 17:07:24                     VALLE FRUT
## 2497         MX001 Abarrotes 23/06/2020 23:50:01                          BIMBO
## 2498         MX001 Abarrotes 23/06/2020 23:50:01                           LALA
## 2499         MX001 Abarrotes 21/06/2020 17:08:26                      PALMOLIVE
## 2500         MX001 Abarrotes 23/06/2020 23:50:44                           LALA
## 2501         MX001 Abarrotes 23/06/2020 23:50:44                          PEPSI
## 2502         MX001 Abarrotes 23/06/2020 23:51:49                           LALA
## 2503         MX001 Abarrotes 21/06/2020 17:10:31                          PULPY
## 2504         MX001 Abarrotes 21/06/2020 17:12:09                    PEPSI LIGHT
## 2505         MX001 Abarrotes 23/06/2020 23:52:45                          PEPSI
## 2506         MX001 Abarrotes 21/06/2020 17:12:58                      COCA COLA
## 2507         MX001 Abarrotes 21/06/2020 17:14:54                          GOLOS
## 2508         MX001 Abarrotes 21/06/2020 17:14:54                       SABRITAS
## 2509         MX001 Abarrotes 21/06/2020 17:14:54                        RUFFLES
## 2510         MX001 Abarrotes 23/06/2020 23:52:59                       MARUCHAN
## 2511         MX001 Abarrotes 21/06/2020 17:14:54                        BOKADOS
## 2512         MX001 Abarrotes 21/06/2020 17:14:54 CHICHARRON DE CERDO (SABRITAS)
## 2513         MX001 Abarrotes 21/06/2020 17:15:18                      COCA COLA
## 2514         MX001 Abarrotes 23/06/2020 23:56:08                       PAKETAXO
## 2515         MX001 Abarrotes 21/06/2020 17:25:30                     TOPO CHICO
## 2516         MX001 Abarrotes 24/06/2020 00:00:48                       FRUTIMAX
## 2517         MX001 Abarrotes 24/06/2020 00:02:46                VELADORA MEXICO
## 2518         MX001 Abarrotes 24/06/2020 00:02:46                VELADORA MEXICO
## 2519         MX001 Abarrotes 21/06/2020 17:29:05                      COCA COLA
## 2520         MX001 Abarrotes 24/06/2020 00:02:46                           LALA
## 2521         MX001 Abarrotes 24/06/2020 00:02:46                      COCA COLA
## 2522         MX001 Abarrotes 24/06/2020 00:02:46                           LALA
## 2523         MX001 Abarrotes 21/06/2020 17:29:05                       MARLBORO
## 2524         MX001 Abarrotes 21/06/2020 17:32:09                       SEVEN UP
## 2525         MX001 Abarrotes 21/06/2020 17:32:09                          PEPSI
## 2526         MX001 Abarrotes 24/06/2020 00:03:45                         SQUIRT
## 2527         MX001 Abarrotes 24/06/2020 00:08:52                       GATORADE
## 2528         MX001 Abarrotes 24/06/2020 00:17:19                          PEPSI
## 2529         MX001 Abarrotes 24/06/2020 00:17:55                      COCA COLA
## 2530         MX001 Abarrotes 21/06/2020 17:43:29                      COCA COLA
## 2531         MX001 Abarrotes 24/06/2020 00:19:24                          BIMBO
## 2532         MX001 Abarrotes 24/06/2020 00:21:48                       MARLBORO
## 2533         MX001 Abarrotes 24/06/2020 00:28:19                    PEPSI LIGHT
## 2534         MX001 Abarrotes 24/06/2020 00:28:19                       KARTAMUS
## 2535         MX001 Abarrotes 24/06/2020 00:31:32                       MARINELA
## 2536         MX001 Abarrotes 21/06/2020 17:47:44                         GERBER
## 2537         MX001 Abarrotes 24/06/2020 00:31:32                            SOL
## 2538         MX001 Abarrotes 24/06/2020 00:31:32                       POWERADE
## 2539         MX001 Abarrotes 24/06/2020 00:31:32                           LALA
## 2540         MX001 Abarrotes 21/06/2020 17:53:48                          PEPSI
## 2541         MX001 Abarrotes 24/06/2020 00:35:14                  MANZANITA SOL
## 2542         MX001 Abarrotes 21/06/2020 17:53:48                      COCA COLA
## 2543         MX001 Abarrotes 21/06/2020 17:53:48                          FANTA
## 2544         MX001 Abarrotes 21/06/2020 17:53:48                           JOYA
## 2545         MX001 Abarrotes 24/06/2020 00:40:43                       TOSTITOS
## 2546         MX001 Abarrotes 24/06/2020 00:40:43                           JOYA
## 2547         MX001 Abarrotes 21/06/2020 17:57:22                       CRUJITOS
## 2548         MX001 Abarrotes 21/06/2020 17:57:22                     VALLE FRUT
## 2549         MX001 Abarrotes 24/06/2020 08:49:29                       PAKETAXO
## 2550         MX001 Abarrotes 24/06/2020 08:49:29                           TANG
## 2551         MX001 Abarrotes 24/06/2020 08:49:29                      NORTEÑITA
## 2552         MX001 Abarrotes 24/06/2020 08:49:29                           TANG
## 2553         MX001 Abarrotes 24/06/2020 09:00:03                          PEPSI
## 2554         MX001 Abarrotes 21/06/2020 18:03:28                     CHURRUMAIS
## 2555         MX001 Abarrotes 24/06/2020 09:02:46                            LEO
## 2556         MX001 Abarrotes 24/06/2020 09:15:32              EMPERADOR (SENZO)
## 2557         MX001 Abarrotes 24/06/2020 09:15:32                    SANTA CLARA
## 2558         MX001 Abarrotes 24/06/2020 09:20:07                     TOPO CHICO
## 2559         MX001 Abarrotes 24/06/2020 09:20:07                            SOL
## 2560         MX001 Abarrotes 21/06/2020 18:05:00                         FRESCA
## 2561         MX001 Abarrotes 24/06/2020 09:20:31                        ENCANTO
## 2562         MX001 Abarrotes 24/06/2020 09:20:31                          BIMBO
## 2563         MX001 Abarrotes 24/06/2020 09:20:31                  MANZANITA SOL
## 2564         MX001 Abarrotes 24/06/2020 09:24:34                            ACE
## 2565         MX001 Abarrotes 24/06/2020 09:24:34                       CLORALEX
## 2566         MX001 Abarrotes 21/06/2020 18:06:53                       MARLBORO
## 2567         MX001 Abarrotes 24/06/2020 09:24:34                           ZOTE
## 2568         MX001 Abarrotes 24/06/2020 09:24:34                      CONSOMATE
## 2569         MX001 Abarrotes 24/06/2020 09:24:34                          AXION
## 2570         MX001 Abarrotes 24/06/2020 09:37:53                      COCA COLA
## 2571         MX001 Abarrotes 21/06/2020 18:07:30                           LALA
## 2572         MX001 Abarrotes 24/06/2020 09:51:12                      COCA COLA
## 2573         MX001 Abarrotes 21/06/2020 18:10:31                       SNICKERS
## 2574         MX001 Abarrotes 21/06/2020 18:10:46                    DE LA VIUDA
## 2575         MX001 Abarrotes 21/06/2020 18:11:21                          PEPSI
## 2576         MX001 Abarrotes 21/06/2020 18:11:44                      COCA COLA
## 2577         MX001 Abarrotes 24/06/2020 10:29:11                      DEL MONTE
## 2578         MX001 Abarrotes 24/06/2020 10:29:11                           TUNY
## 2579         MX001 Abarrotes 24/06/2020 10:29:11                     VALLE FRUT
## 2580         MX001 Abarrotes 21/06/2020 18:11:44                           LINK
## 2581         MX001 Abarrotes 24/06/2020 10:33:03                         GAMESA
## 2582         MX001 Abarrotes 21/06/2020 18:13:26                    SANTA CLARA
## 2583         MX001 Abarrotes 21/06/2020 18:13:57                       SABRITAS
## 2584         MX001 Abarrotes 24/06/2020 11:08:22                        DORITOS
## 2585         MX001 Abarrotes 24/06/2020 11:08:22                          PEPSI
## 2586         MX001 Abarrotes 21/06/2020 18:14:44             SALADITAS (GAMESA)
## 2587         MX001 Abarrotes 24/06/2020 11:14:04                           ZUKO
## 2588         MX001 Abarrotes 21/06/2020 18:17:13                       FABULOSO
## 2589         MX001 Abarrotes 21/06/2020 18:17:13                          SALVO
## 2590         MX001 Abarrotes 24/06/2020 11:15:58                     VALLE FRUT
## 2591         MX001 Abarrotes 24/06/2020 11:15:58                          EPURA
## 2592         MX001 Abarrotes 24/06/2020 11:18:15              EMPERADOR (SENZO)
## 2593         MX001 Abarrotes 24/06/2020 11:18:15                          BIMBO
## 2594         MX001 Abarrotes 21/06/2020 18:19:02                          JUMEX
## 2595         MX001 Abarrotes 24/06/2020 11:21:41                       COLGATE 
## 2596         MX001 Abarrotes 24/06/2020 11:21:41                      COCA COLA
## 2597         MX001 Abarrotes 21/06/2020 18:20:03                      COCA COLA
## 2598         MX001 Abarrotes 21/06/2020 18:20:52                          EPURA
## 2599         MX001 Abarrotes 24/06/2020 11:26:24                       BE-LIGHT
## 2600         MX001 Abarrotes 24/06/2020 11:26:24                     ELECTROLIT
## 2601         MX001 Abarrotes 24/06/2020 11:26:24                     ELECTROLIT
## 2602         MX001 Abarrotes 24/06/2020 11:30:05                VELADORA MEXICO
## 2603         MX001 Abarrotes 24/06/2020 11:30:05                          PEPSI
## 2604         MX001 Abarrotes 24/06/2020 11:30:05                      CONSOMATE
## 2605         MX001 Abarrotes 21/06/2020 18:21:52                     CHOCO MILK
## 2606         MX001 Abarrotes 21/06/2020 18:22:51                          ARIEL
## 2607         MX001 Abarrotes 21/06/2020 18:23:09                     LA COSTEÑA
## 2608         MX001 Abarrotes 21/06/2020 18:23:09                      NORTEÑITA
## 2609         MX001 Abarrotes 21/06/2020 18:24:57                           LALA
## 2610         MX001 Abarrotes 21/06/2020 18:24:57                          BIMBO
## 2611         MX001 Abarrotes 21/06/2020 18:24:57                          BIMBO
## 2612         MX001 Abarrotes 21/06/2020 18:24:57                          JUMEX
## 2613         MX001 Abarrotes 24/06/2020 11:31:26                          PEPSI
## 2614         MX001 Abarrotes 21/06/2020 18:27:40                        DORITOS
## 2615         MX001 Abarrotes 21/06/2020 18:27:40                        CHEETOS
## 2616         MX001 Abarrotes 24/06/2020 11:40:19                         MONELI
## 2617         MX001 Abarrotes 24/06/2020 11:45:15                      DEL VALLE
## 2618         MX001 Abarrotes 21/06/2020 18:32:18                          FLASH
## 2619         MX001 Abarrotes 21/06/2020 18:32:18                         CHIMEX
## 2620         MX001 Abarrotes 24/06/2020 11:47:25                          KNORR
## 2621         MX001 Abarrotes 21/06/2020 18:33:33                      CONVERMEX
## 2622         MX001 Abarrotes 21/06/2020 18:33:33                      NORTEÑITA
## 2623         MX001 Abarrotes 21/06/2020 18:33:56                          BIMBO
## 2624         MX001 Abarrotes 24/06/2020 11:52:04                      COCA COLA
## 2625         MX001 Abarrotes 24/06/2020 11:52:04                           VOLT
## 2626         MX001 Abarrotes 24/06/2020 11:54:37                          PEPSI
## 2627         MX001 Abarrotes 21/06/2020 18:41:02                          PEPSI
## 2628         MX001 Abarrotes 21/06/2020 18:41:42                           AJAX
## 2629         MX001 Abarrotes 24/06/2020 11:58:32                           TANG
## 2630         MX001 Abarrotes 24/06/2020 11:58:32                           ZUKO
## 2631         MX001 Abarrotes 21/06/2020 18:42:53                          PEPSI
## 2632         MX001 Abarrotes 21/06/2020 18:42:53                           JOYA
## 2633         MX001 Abarrotes 21/06/2020 18:42:53                      CONVERMEX
## 2634         MX001 Abarrotes 21/06/2020 18:42:53                      CONVERMEX
## 2635         MX001 Abarrotes 24/06/2020 12:00:29                          PEPSI
## 2636         MX001 Abarrotes 21/06/2020 18:43:57                      COCA COLA
## 2637         MX001 Abarrotes 21/06/2020 18:43:57                  SIDRAL MUNDET
## 2638         MX001 Abarrotes 21/06/2020 18:43:57                       SNICKERS
## 2639         MX001 Abarrotes 24/06/2020 12:00:46                        PRISPAS
## 2640         MX001 Abarrotes 24/06/2020 12:00:46                      DEL VALLE
## 2641         MX001 Abarrotes 21/06/2020 18:45:15                         SQUIRT
## 2642         MX001 Abarrotes 21/06/2020 18:46:26                     TOPO CHICO
## 2643         MX001 Abarrotes 24/06/2020 12:02:27                           TANG
## 2644         MX001 Abarrotes 21/06/2020 18:47:19                          PEPSI
## 2645         MX001 Abarrotes 21/06/2020 18:47:19                         FRESCA
## 2646         MX001 Abarrotes 21/06/2020 18:47:39                      COCA COLA
## 2647         MX001 Abarrotes 24/06/2020 12:20:45                     LA COSTEÑA
## 2648         MX001 Abarrotes 21/06/2020 18:54:30                       MARINELA
## 2649         MX001 Abarrotes 21/06/2020 18:54:30                       MARINELA
## 2650         MX001 Abarrotes 24/06/2020 12:23:19                          FLAMA
## 2651         MX001 Abarrotes 24/06/2020 12:23:19                       FRUTIMAX
## 2652         MX001 Abarrotes 24/06/2020 12:23:45                      COCA COLA
## 2653         MX001 Abarrotes 24/06/2020 12:28:39                          PEPSI
## 2654         MX001 Abarrotes 24/06/2020 12:29:48                           ROMA
## 2655         MX001 Abarrotes 24/06/2020 12:29:48                       CLORALEX
## 2656         MX001 Abarrotes 21/06/2020 18:58:56                       MARUCHAN
## 2657         MX001 Abarrotes 21/06/2020 18:58:56                  MANZANITA SOL
## 2658         MX001 Abarrotes 24/06/2020 12:32:26                     LA MODERNA
## 2659         MX001 Abarrotes 21/06/2020 18:58:56                       MARUCHAN
## 2660         MX001 Abarrotes 21/06/2020 18:58:56                          PEPSI
## 2661         MX001 Abarrotes 24/06/2020 12:33:46                      VALENTINA
## 2662         MX001 Abarrotes 24/06/2020 12:33:46                           FOCA
## 2663         MX001 Abarrotes 24/06/2020 12:33:46                          BIMBO
## 2664         MX001 Abarrotes 24/06/2020 12:33:46                      DEL MONTE
## 2665         MX001 Abarrotes 24/06/2020 12:34:27                      COCA COLA
## 2666         MX001 Abarrotes 24/06/2020 12:34:46                    PEPSI LIGHT
## 2667         MX001 Abarrotes 21/06/2020 19:00:59                      PALL MALL
## 2668         MX001 Abarrotes 21/06/2020 19:01:35                          PEPSI
## 2669         MX001 Abarrotes 21/06/2020 19:01:35                        MIRINDA
## 2670         MX001 Abarrotes 24/06/2020 12:44:43                      COCA COLA
## 2671         MX001 Abarrotes 24/06/2020 12:44:43                        ISADORA
## 2672         MX001 Abarrotes 21/06/2020 19:05:13                    LA BOTANERA
## 2673         MX001 Abarrotes 24/06/2020 12:47:33                        DORITOS
## 2674         MX001 Abarrotes 24/06/2020 12:50:54                         NORVER
## 2675         MX001 Abarrotes 21/06/2020 19:06:02                         SQUIRT
## 2676         MX001 Abarrotes 24/06/2020 12:50:54                       DIAMANTE
## 2677         MX001 Abarrotes 24/06/2020 12:57:00                       GATORADE
## 2678         MX001 Abarrotes 21/06/2020 19:07:28                  MANZANITA SOL
## 2679         MX001 Abarrotes 24/06/2020 13:02:25                       GATORADE
## 2680         MX001 Abarrotes 24/06/2020 13:02:25                         DANONE
## 2681         MX001 Abarrotes 21/06/2020 19:10:19                          PEPSI
## 2682         MX001 Abarrotes 21/06/2020 19:10:59                      COCA COLA
## 2683         MX001 Abarrotes 21/06/2020 19:14:35                          BIMBO
## 2684         MX001 Abarrotes 21/06/2020 19:14:35                          BIMBO
## 2685         MX001 Abarrotes 24/06/2020 13:14:22                         DANONE
## 2686         MX001 Abarrotes 21/06/2020 19:15:53                    MEDIA CREMA
## 2687         MX001 Abarrotes 21/06/2020 19:15:53               CARNATION CLAVEL
## 2688         MX001 Abarrotes 24/06/2020 13:19:14                          BIMBO
## 2689         MX001 Abarrotes 24/06/2020 13:24:34                       MARLBORO
## 2690         MX001 Abarrotes 21/06/2020 19:17:01                        NESCAFE
## 2691         MX001 Abarrotes 24/06/2020 13:24:34                          PEPSI
## 2692         MX001 Abarrotes 21/06/2020 19:17:50                       DANONINO
## 2693         MX001 Abarrotes 24/06/2020 13:29:39                          BIMBO
## 2694         MX001 Abarrotes 24/06/2020 13:29:39                       MARINELA
## 2695         MX001 Abarrotes 24/06/2020 13:30:55                     LA COSTEÑA
## 2696         MX001 Abarrotes 24/06/2020 13:30:55                     DEL FUERTE
## 2697         MX001 Abarrotes 24/06/2020 13:30:55                     DEL FUERTE
## 2698         MX001 Abarrotes 21/06/2020 19:19:02                       GATORADE
## 2699         MX001 Abarrotes 21/06/2020 19:19:02                        DORITOS
## 2700         MX001 Abarrotes 24/06/2020 13:32:16                       CLORALEX
## 2701         MX001 Abarrotes 24/06/2020 13:32:51                           JOYA
## 2702         MX001 Abarrotes 21/06/2020 19:20:03                         NORVER
## 2703         MX001 Abarrotes 24/06/2020 13:34:25                  ROGELIO BUENO
## 2704         MX001 Abarrotes 21/06/2020 19:20:18                       JARRITOS
## 2705         MX001 Abarrotes 24/06/2020 13:45:09                        CHEETOS
## 2706         MX001 Abarrotes 24/06/2020 13:45:09                          PEPSI
## 2707         MX001 Abarrotes 21/06/2020 19:21:58                    PEPSI LIGHT
## 2708         MX001 Abarrotes 21/06/2020 19:21:58                      COCA COLA
## 2709         MX001 Abarrotes 24/06/2020 13:52:52                       SABRITAS
## 2710         MX001 Abarrotes 21/06/2020 19:22:37                      CONVERMEX
## 2711         MX001 Abarrotes 21/06/2020 19:22:37                      CONVERMEX
## 2712         MX001 Abarrotes 24/06/2020 14:01:23                          PEPSI
## 2713         MX001 Abarrotes 21/06/2020 19:23:32                BENSON & HEDGES
## 2714         MX001 Abarrotes 21/06/2020 19:23:32                       MARLBORO
## 2715         MX001 Abarrotes 24/06/2020 14:43:38                      DEL MONTE
## 2716         MX001 Abarrotes 24/06/2020 14:43:38                      COCA COLA
## 2717         MX001 Abarrotes 24/06/2020 14:44:15                        DORITOS
## 2718         MX001 Abarrotes 21/06/2020 19:24:44                        CHEETOS
## 2719         MX001 Abarrotes 21/06/2020 19:24:44                          JUMEX
## 2720         MX001 Abarrotes 24/06/2020 14:45:00                       DIAMANTE
## 2721         MX001 Abarrotes 21/06/2020 19:25:41                        RUFFLES
## 2722         MX001 Abarrotes 24/06/2020 14:45:24             SALADITAS (GAMESA)
## 2723         MX001 Abarrotes 21/06/2020 19:25:41                          PEPSI
## 2724         MX001 Abarrotes 21/06/2020 19:25:57                 ZONA DEL SABOR
## 2725         MX001 Abarrotes 21/06/2020 19:26:45                        DORITOS
## 2726         MX001 Abarrotes 24/06/2020 15:25:06                            H24
## 2727         MX001 Abarrotes 24/06/2020 15:26:15                          PEPSI
## 2728         MX001 Abarrotes 24/06/2020 15:27:24                      COCA COLA
## 2729         MX001 Abarrotes 24/06/2020 15:27:24                          GOLOS
## 2730         MX001 Abarrotes 21/06/2020 19:30:46                      PALMOLIVE
## 2731         MX001 Abarrotes 21/06/2020 19:31:02                          KOTEX
## 2732         MX001 Abarrotes 24/06/2020 15:36:20                        PREMIER
## 2733         MX001 Abarrotes 24/06/2020 15:36:20                       CLORALEX
## 2734         MX001 Abarrotes 21/06/2020 19:33:14                          BIMBO
## 2735         MX001 Abarrotes 21/06/2020 19:33:14                            FUD
## 2736         MX001 Abarrotes 21/06/2020 19:33:14                       MARINELA
## 2737         MX001 Abarrotes 21/06/2020 19:33:14                     BLUE HOUSE
## 2738         MX001 Abarrotes 24/06/2020 15:38:35             CHEESE PUFFS (LEO)
## 2739         MX001 Abarrotes 24/06/2020 15:38:35                      COCA COLA
## 2740         MX001 Abarrotes 21/06/2020 19:34:44                     TOPO CHICO
## 2741         MX001 Abarrotes 21/06/2020 19:34:44                           JOYA
## 2742         MX001 Abarrotes 24/06/2020 15:40:37                        ISADORA
## 2743         MX001 Abarrotes 24/06/2020 15:40:37                EL GALLO DE ORO
## 2744         MX001 Abarrotes 21/06/2020 19:37:13                        DORITOS
## 2745         MX001 Abarrotes 24/06/2020 15:48:20                          PEPSI
## 2746         MX001 Abarrotes 21/06/2020 19:39:02                           LINK
## 2747         MX001 Abarrotes 21/06/2020 19:39:02                      COCA COLA
## 2748         MX001 Abarrotes 24/06/2020 15:53:05                        RUFFLES
## 2749         MX001 Abarrotes 24/06/2020 15:53:05                    LA BOTANERA
## 2750         MX001 Abarrotes 24/06/2020 15:53:05                          PEPSI
## 2751         MX001 Abarrotes 24/06/2020 15:53:05                          PEPSI
## 2752         MX001 Abarrotes 24/06/2020 15:53:05                           TANG
## 2753         MX001 Abarrotes 24/06/2020 15:53:05                       POWERADE
## 2754         MX001 Abarrotes 24/06/2020 15:54:29                           TANG
## 2755         MX001 Abarrotes 24/06/2020 15:54:29                           TANG
## 2756         MX001 Abarrotes 24/06/2020 15:55:19                        LA FINA
## 2757         MX001 Abarrotes 24/06/2020 15:56:41             SALADITAS (GAMESA)
## 2758         MX001 Abarrotes 21/06/2020 19:41:55                    ELECTROPURA
## 2759         MX001 Abarrotes 24/06/2020 16:02:25                         FRUTSI
## 2760         MX001 Abarrotes 24/06/2020 16:02:25                          BIMBO
## 2761         MX001 Abarrotes 21/06/2020 19:42:37                          PEPSI
## 2762         MX001 Abarrotes 21/06/2020 19:43:17                           JOYA
## 2763         MX001 Abarrotes 24/06/2020 16:11:15                      COCA COLA
## 2764         MX001 Abarrotes 24/06/2020 16:18:50                           SABA
## 2765         MX001 Abarrotes 24/06/2020 16:24:12                           LALA
## 2766         MX001 Abarrotes 24/06/2020 16:26:10                      COCA COLA
## 2767         MX001 Abarrotes 24/06/2020 16:34:40                 ELTORITO REGIO
## 2768         MX001 Abarrotes 24/06/2020 17:57:26                     HELLMANN´S
## 2769         MX001 Abarrotes 24/06/2020 17:57:26                        MIRINDA
## 2770         MX001 Abarrotes 21/06/2020 19:48:59                     TOPO CHICO
## 2771         MX001 Abarrotes 21/06/2020 19:48:59                        RUFFLES
## 2772         MX001 Abarrotes 21/06/2020 19:50:45                       MARLBORO
## 2773         MX001 Abarrotes 21/06/2020 19:50:45                      NORTEÑITA
## 2774         MX001 Abarrotes 24/06/2020 18:13:24                    MEDIA CREMA
## 2775         MX001 Abarrotes 21/06/2020 19:51:21                          PEPSI
## 2776         MX001 Abarrotes 24/06/2020 18:13:24                     DEL FUERTE
## 2777         MX001 Abarrotes 21/06/2020 19:51:21                     DEL FUERTE
## 2778         MX001 Abarrotes 21/06/2020 19:52:44                          PEPSI
## 2779         MX001 Abarrotes 21/06/2020 19:52:44                        MIRINDA
## 2780         MX001 Abarrotes 24/06/2020 18:16:53                      COCA COLA
## 2781         MX001 Abarrotes 24/06/2020 18:18:03                       SEVEN UP
## 2782         MX001 Abarrotes 21/06/2020 19:56:12                           JOYA
## 2783         MX001 Abarrotes 24/06/2020 18:19:48                          BIMBO
## 2784         MX001 Abarrotes 21/06/2020 19:57:39                       GATORADE
## 2785         MX001 Abarrotes 21/06/2020 19:57:39                          PEPSI
## 2786         MX001 Abarrotes 21/06/2020 19:57:39                          BIMBO
## 2787         MX001 Abarrotes 21/06/2020 19:58:14                BENSON & HEDGES
## 2788         MX001 Abarrotes 21/06/2020 19:58:29                        CHEETOS
## 2789         MX001 Abarrotes 21/06/2020 19:58:29                        DORITOS
## 2790         MX001 Abarrotes 24/06/2020 18:25:02                       DANONINO
## 2791         MX001 Abarrotes 24/06/2020 18:28:54                      COCA COLA
## 2792         MX001 Abarrotes 24/06/2020 18:35:21                       FABULOSO
## 2793         MX001 Abarrotes 24/06/2020 18:35:21                          SALVO
## 2794         MX001 Abarrotes 21/06/2020 20:01:35                      PALL MALL
## 2795         MX001 Abarrotes 24/06/2020 18:37:23                          PEPSI
## 2796         MX001 Abarrotes 21/06/2020 20:02:31                          BIMBO
## 2797         MX001 Abarrotes 21/06/2020 20:03:04                          PEPSI
## 2798         MX001 Abarrotes 21/06/2020 20:03:04                      CONVERMEX
## 2799         MX001 Abarrotes 24/06/2020 18:38:59                      COCA COLA
## 2800         MX001 Abarrotes 24/06/2020 18:38:59                  SIDRAL MUNDET
## 2801         MX001 Abarrotes 21/06/2020 20:04:10                           JOYA
## 2802         MX001 Abarrotes 21/06/2020 20:05:23                         DANONE
## 2803         MX001 Abarrotes 24/06/2020 18:41:51                          EPURA
## 2804         MX001 Abarrotes 21/06/2020 20:10:49                          PEPSI
## 2805         MX001 Abarrotes 21/06/2020 20:10:49                     DEL FUERTE
## 2806         MX001 Abarrotes 21/06/2020 20:11:29                     VALLE FRUT
## 2807         MX001 Abarrotes 21/06/2020 20:14:42                     TOPO CHICO
## 2808         MX001 Abarrotes 21/06/2020 20:14:42                     TOPO CHICO
## 2809         MX001 Abarrotes 21/06/2020 20:14:42                          PEPSI
## 2810         MX001 Abarrotes 21/06/2020 20:15:03                      COCA COLA
## 2811         MX001 Abarrotes 21/06/2020 20:15:58                         CHIMEX
## 2812         MX001 Abarrotes 21/06/2020 20:15:58                      COCA COLA
## 2813         MX001 Abarrotes 24/06/2020 18:44:41                      COCA COLA
## 2814         MX001 Abarrotes 24/06/2020 18:45:20                       MARINELA
## 2815         MX001 Abarrotes 21/06/2020 20:18:03                    ELECTROPURA
## 2816         MX001 Abarrotes 24/06/2020 18:46:02                     TOPO CHICO
## 2817         MX001 Abarrotes 24/06/2020 18:46:02                            SOL
## 2818         MX001 Abarrotes 24/06/2020 18:47:07                          PEPSI
## 2819         MX001 Abarrotes 24/06/2020 18:47:07                         SQUIRT
## 2820         MX001 Abarrotes 24/06/2020 18:47:07                      NORTEÑITA
## 2821         MX001 Abarrotes 24/06/2020 18:50:26                         GAMESA
## 2822         MX001 Abarrotes 24/06/2020 18:50:26                  VARIOS DANONE
## 2823         MX001 Abarrotes 21/06/2020 20:26:34                          EPURA
## 2824         MX001 Abarrotes 21/06/2020 20:31:26                           LALA
## 2825         MX001 Abarrotes 24/06/2020 18:55:13                        CHEETOS
## 2826         MX001 Abarrotes 21/06/2020 20:32:28                          BIMBO
## 2827         MX001 Abarrotes 21/06/2020 20:32:28                           LALA
## 2828         MX001 Abarrotes 21/06/2020 20:32:28                           JOYA
## 2829         MX001 Abarrotes 21/06/2020 20:36:26                      COCA COLA
## 2830         MX001 Abarrotes 21/06/2020 20:36:26                         FRESCA
## 2831         MX001 Abarrotes 24/06/2020 19:01:04                            FUD
## 2832         MX001 Abarrotes 21/06/2020 20:36:43                      COCA COLA
## 2833         MX001 Abarrotes 21/06/2020 20:37:26                     EL JIMADOR
## 2834         MX001 Abarrotes 24/06/2020 19:03:20                     LA COSTEÑA
## 2835         MX001 Abarrotes 24/06/2020 19:03:20                  MANZANITA SOL
## 2836         MX001 Abarrotes 24/06/2020 19:03:20                        ISADORA
## 2837         MX001 Abarrotes 24/06/2020 19:04:35                       MARINELA
## 2838         MX001 Abarrotes 21/06/2020 20:41:41                         SQUIRT
## 2839         MX001 Abarrotes 24/06/2020 19:09:43                EL GALLO DE ORO
## 2840         MX001 Abarrotes 21/06/2020 20:42:15                      COCA COLA
## 2841         MX001 Abarrotes 21/06/2020 20:42:15                          PICOT
## 2842         MX001 Abarrotes 24/06/2020 19:16:37                        NORTEÑO
## 2843         MX001 Abarrotes 21/06/2020 20:43:19                       MARINELA
## 2844         MX001 Abarrotes 21/06/2020 20:43:19                          BIMBO
## 2845         MX001 Abarrotes 24/06/2020 19:17:47                        BOKADOS
## 2846         MX001 Abarrotes 21/06/2020 20:43:32                    PEPSI LIGHT
## 2847         MX001 Abarrotes 24/06/2020 19:17:47                          BIMBO
## 2848         MX001 Abarrotes 24/06/2020 19:19:05                            FUD
## 2849         MX001 Abarrotes 21/06/2020 20:43:50                          PEPSI
## 2850         MX001 Abarrotes 24/06/2020 19:20:21                          PEPSI
## 2851         MX001 Abarrotes 24/06/2020 19:21:21                    RANCH STYLE
## 2852         MX001 Abarrotes 21/06/2020 20:46:26                          PEPSI
## 2853         MX001 Abarrotes 24/06/2020 19:21:21                  MANZANITA SOL
## 2854         MX001 Abarrotes 21/06/2020 20:46:26                           JOYA
## 2855         MX001 Abarrotes 24/06/2020 19:22:25                      COCA COLA
## 2856         MX001 Abarrotes 21/06/2020 20:50:18                          PEPSI
## 2857         MX001 Abarrotes 21/06/2020 20:50:18                           JOYA
## 2858         MX001 Abarrotes 21/06/2020 20:53:11                          FLAMA
## 2859         MX001 Abarrotes 21/06/2020 20:53:11                           JOYA
## 2860         MX001 Abarrotes 21/06/2020 20:56:04                COCA COLA LIGHT
## 2861         MX001 Abarrotes 21/06/2020 20:56:04                COCA COLA LIGHT
## 2862         MX001 Abarrotes 24/06/2020 19:36:59                          PEPSI
## 2863         MX001 Abarrotes 24/06/2020 19:37:32                      DEL VALLE
## 2864         MX001 Abarrotes 24/06/2020 19:37:57                       SEVEN UP
## 2865         MX001 Abarrotes 24/06/2020 19:38:37                          PEPSI
## 2866         MX001 Abarrotes 24/06/2020 19:39:25                          PEPSI
## 2867         MX001 Abarrotes 21/06/2020 21:00:19                      PALMOLIVE
## 2868         MX001 Abarrotes 24/06/2020 19:40:00                          PEPSI
## 2869         MX001 Abarrotes 21/06/2020 21:01:17                           INCA
## 2870         MX001 Abarrotes 21/06/2020 21:01:17                       BUBBALOO
## 2871         MX001 Abarrotes 24/06/2020 19:41:04             SALADITAS (GAMESA)
## 2872         MX001 Abarrotes 24/06/2020 19:41:04                     LA COSTEÑA
## 2873         MX001 Abarrotes 24/06/2020 19:41:24                      NORTEÑITA
## 2874         MX001 Abarrotes 24/06/2020 19:41:44                          PEPSI
## 2875         MX001 Abarrotes 21/06/2020 21:07:38                          BIMBO
## 2876         MX001 Abarrotes 21/06/2020 21:07:38                          PEPSI
## 2877         MX001 Abarrotes 24/06/2020 19:42:51                       PAKETAXO
## 2878         MX001 Abarrotes 24/06/2020 19:42:51                          PEPSI
## 2879         MX001 Abarrotes 21/06/2020 21:08:45                      PALL MALL
## 2880         MX001 Abarrotes 21/06/2020 21:09:37                       TIA ROSA
## 2881         MX001 Abarrotes 24/06/2020 19:43:28                           NIDO
## 2882         MX001 Abarrotes 21/06/2020 21:12:17                        DORITOS
## 2883         MX001 Abarrotes 21/06/2020 21:12:17                        CHEETOS
## 2884         MX001 Abarrotes 21/06/2020 21:12:17                    RANCHERITOS
## 2885         MX001 Abarrotes 24/06/2020 19:44:24                          PEPSI
## 2886         MX001 Abarrotes 21/06/2020 21:12:17                      COCA COLA
## 2887         MX001 Abarrotes 21/06/2020 21:12:17                         BOGO´S
## 2888         MX001 Abarrotes 21/06/2020 21:13:13                    NUTRI LECHE
## 2889         MX001 Abarrotes 21/06/2020 21:13:13                          BIMBO
## 2890         MX001 Abarrotes 24/06/2020 19:45:08                           EPIX
## 2891         MX001 Abarrotes 24/06/2020 19:45:40                      CONVERMEX
## 2892         MX001 Abarrotes 24/06/2020 19:45:40                      CONVERMEX
## 2893         MX001 Abarrotes 24/06/2020 19:46:04             SALADITAS (GAMESA)
## 2894         MX001 Abarrotes 24/06/2020 19:46:17                        DORITOS
## 2895         MX001 Abarrotes 21/06/2020 21:15:47                      DEL VALLE
## 2896         MX001 Abarrotes 24/06/2020 19:47:41                          BIMBO
## 2897         MX001 Abarrotes 21/06/2020 21:16:40                          PEPSI
## 2898         MX001 Abarrotes 21/06/2020 21:19:14                       MARLBORO
## 2899         MX001 Abarrotes 21/06/2020 21:22:55                          PEPSI
## 2900         MX001 Abarrotes 24/06/2020 19:50:21                         ACT II
## 2901         MX001 Abarrotes 24/06/2020 19:50:21             SALADITAS (GAMESA)
## 2902         MX001 Abarrotes 24/06/2020 19:50:21                          MAMUT
## 2903         MX001 Abarrotes 24/06/2020 19:50:21                          PEPSI
## 2904         MX001 Abarrotes 21/06/2020 21:24:59                       TOSTITOS
## 2905         MX001 Abarrotes 21/06/2020 21:24:59                       TOSTITOS
## 2906         MX001 Abarrotes 21/06/2020 21:25:45                         SQUIRT
## 2907         MX001 Abarrotes 21/06/2020 21:25:45                      MILKY WAY
## 2908         MX001 Abarrotes 21/06/2020 21:25:45                         NEVADA
## 2909         MX001 Abarrotes 21/06/2020 21:27:21                          PEPSI
## 2910         MX001 Abarrotes 24/06/2020 19:52:13                        ENCANTO
## 2911         MX001 Abarrotes 24/06/2020 19:52:13                        CHEETOS
## 2912         MX001 Abarrotes 21/06/2020 21:28:35                         HERDEZ
## 2913         MX001 Abarrotes 24/06/2020 19:53:02                        CHEETOS
## 2914         MX001 Abarrotes 24/06/2020 19:53:02                       CRUJITOS
## 2915         MX001 Abarrotes 24/06/2020 19:54:07                        CHEETOS
## 2916         MX001 Abarrotes 24/06/2020 19:54:07                     VALLE FRUT
## 2917         MX001 Abarrotes 24/06/2020 19:56:09                         NORVER
## 2918         MX001 Abarrotes 21/06/2020 21:31:29                EL GALLO DE ORO
## 2919         MX001 Abarrotes 21/06/2020 21:32:28                       SABRITAS
## 2920         MX001 Abarrotes 21/06/2020 21:32:28                         GAMESA
## 2921         MX001 Abarrotes 24/06/2020 19:57:33                        CHEETOS
## 2922         MX001 Abarrotes 21/06/2020 21:32:28                       SEVEN UP
## 2923         MX001 Abarrotes 21/06/2020 21:32:28                          JUMEX
## 2924         MX001 Abarrotes 21/06/2020 21:33:19                        DORITOS
## 2925         MX001 Abarrotes 21/06/2020 21:33:19                      COCA COLA
## 2926         MX001 Abarrotes 24/06/2020 19:59:24                       FRUTIMAX
## 2927         MX001 Abarrotes 21/06/2020 21:36:08                          BIMBO
## 2928         MX001 Abarrotes 24/06/2020 19:59:50                          FLAMA
## 2929         MX001 Abarrotes 21/06/2020 21:36:08                          EPURA
## 2930         MX001 Abarrotes 24/06/2020 20:00:11                      COCA COLA
## 2931         MX001 Abarrotes 24/06/2020 20:00:55                      COCA COLA
## 2932         MX001 Abarrotes 21/06/2020 21:38:40                       MARUCHAN
## 2933         MX001 Abarrotes 21/06/2020 21:38:40                        CHEETOS
## 2934         MX001 Abarrotes 24/06/2020 20:04:45                        BOKADOS
## 2935         MX001 Abarrotes 24/06/2020 20:04:45                          PEPSI
## 2936         MX001 Abarrotes 24/06/2020 20:06:10                     LA COSTEÑA
## 2937         MX001 Abarrotes 21/06/2020 21:40:09                           TANG
## 2938         MX001 Abarrotes 24/06/2020 20:06:10                       FRUTIMAX
## 2939         MX001 Abarrotes 24/06/2020 20:06:10                       FRUTIMAX
## 2940         MX001 Abarrotes 24/06/2020 20:06:41                           LINK
## 2941         MX001 Abarrotes 21/06/2020 21:43:52                          PEPSI
## 2942         MX001 Abarrotes 24/06/2020 20:07:20                       MARLBORO
## 2943         MX001 Abarrotes 21/06/2020 21:44:58                      COCA COLA
## 2944         MX001 Abarrotes 24/06/2020 20:07:46                COCA COLA LIGHT
## 2945         MX001 Abarrotes 24/06/2020 20:08:41                          PEPSI
## 2946         MX001 Abarrotes 24/06/2020 20:08:41                          PEPSI
## 2947         MX001 Abarrotes 24/06/2020 20:08:41                     DEL FUERTE
## 2948         MX001 Abarrotes 21/06/2020 21:47:25                       MARLBORO
## 2949         MX001 Abarrotes 24/06/2020 20:09:25                          PEPSI
## 2950         MX001 Abarrotes 24/06/2020 20:09:25                           LALA
## 2951         MX001 Abarrotes 24/06/2020 20:10:07              EMPERADOR (SENZO)
## 2952         MX001 Abarrotes 24/06/2020 20:10:07                CREMAX DE NIEVE
## 2953         MX001 Abarrotes 21/06/2020 21:48:46                        CHEETOS
## 2954         MX001 Abarrotes 24/06/2020 20:10:07                        YOPLAIT
## 2955         MX001 Abarrotes 24/06/2020 20:10:07                        YOPLAIT
## 2956         MX001 Abarrotes 21/06/2020 21:50:12                     TOPO CHICO
## 2957         MX001 Abarrotes 21/06/2020 21:52:37                        CHEETOS
## 2958         MX001 Abarrotes 24/06/2020 20:11:47                     DEL FUERTE
## 2959         MX001 Abarrotes 21/06/2020 21:52:37                         SQUIRT
## 2960         MX001 Abarrotes 24/06/2020 20:12:23                        CHEETOS
## 2961         MX001 Abarrotes 21/06/2020 21:53:05                          PEPSI
## 2962         MX001 Abarrotes 24/06/2020 20:13:48                       PAKETAXO
## 2963         MX001 Abarrotes 24/06/2020 20:13:48                  VARIOS DANONE
## 2964         MX001 Abarrotes 24/06/2020 20:13:48                         DAN UP
## 2965         MX001 Abarrotes 21/06/2020 21:59:50                        CHEETOS
## 2966         MX001 Abarrotes 21/06/2020 22:00:13                      COCA COLA
## 2967         MX001 Abarrotes 24/06/2020 20:14:49                        DORITOS
## 2968         MX001 Abarrotes 21/06/2020 22:00:48                    NUTRI LECHE
## 2969         MX001 Abarrotes 21/06/2020 22:02:16                    LA BOTANERA
## 2970         MX001 Abarrotes 21/06/2020 22:02:16                         ACT II
## 2971         MX001 Abarrotes 21/06/2020 22:02:16                        DORITOS
## 2972         MX001 Abarrotes 21/06/2020 22:02:16                        BOKADOS
## 2973         MX001 Abarrotes 24/06/2020 20:15:43                         MONELI
## 2974         MX001 Abarrotes 21/06/2020 22:03:23                COCA COLA LIGHT
## 2975         MX001 Abarrotes 21/06/2020 22:04:07                           LALA
## 2976         MX001 Abarrotes 24/06/2020 20:16:44                         CHIMEX
## 2977         MX001 Abarrotes 21/06/2020 22:04:07                          EPURA
## 2978         MX001 Abarrotes 24/06/2020 20:18:30                         FRESCA
## 2979         MX001 Abarrotes 24/06/2020 20:19:12                          PEPSI
## 2980         MX001 Abarrotes 24/06/2020 20:19:12                           TANG
## 2981         MX001 Abarrotes 24/06/2020 20:20:02                         DANONE
## 2982         MX001 Abarrotes 24/06/2020 20:20:02                         DANONE
## 2983         MX001 Abarrotes 24/06/2020 20:20:02                        TIX TIX
## 2984         MX001 Abarrotes 24/06/2020 20:20:02                         SQUIRT
## 2985         MX001 Abarrotes 24/06/2020 20:20:02                         DANONE
## 2986         MX001 Abarrotes 24/06/2020 20:20:24                      COCA COLA
## 2987         MX001 Abarrotes 24/06/2020 20:20:59                        POFFETS
## 2988         MX001 Abarrotes 24/06/2020 20:20:59                      COCA COLA
## 2989         MX001 Abarrotes 21/06/2020 22:10:15                           JOYA
## 2990         MX001 Abarrotes 21/06/2020 22:10:59                        ENCANTO
## 2991         MX001 Abarrotes 21/06/2020 22:13:29                       GATORADE
## 2992         MX001 Abarrotes 24/06/2020 20:22:30                         GAMESA
## 2993         MX001 Abarrotes 21/06/2020 22:13:29                         NESTLE
## 2994         MX001 Abarrotes 21/06/2020 22:13:29                       MARLBORO
## 2995         MX001 Abarrotes 24/06/2020 20:22:30                     BLUE HOUSE
## 2996         MX001 Abarrotes 24/06/2020 20:23:04                    RANCH STYLE
## 2997         MX001 Abarrotes 21/06/2020 22:14:12                       POWERADE
## 2998         MX001 Abarrotes 24/06/2020 20:23:41                          BIMBO
## 2999         MX001 Abarrotes 24/06/2020 20:23:41                          BIMBO
## 3000         MX001 Abarrotes 24/06/2020 20:23:41                           LALA
## 3001         MX001 Abarrotes 21/06/2020 22:15:22                          PEPSI
## 3002         MX001 Abarrotes 21/06/2020 22:17:52     BLANCA NIEVES (DETERGENTE)
## 3003         MX001 Abarrotes 21/06/2020 22:17:52                         ALWAYS
## 3004         MX001 Abarrotes 21/06/2020 22:18:43                      COCA COLA
## 3005         MX001 Abarrotes 24/06/2020 20:26:19                        BOKADOS
## 3006         MX001 Abarrotes 24/06/2020 20:26:19                        RUFFLES
## 3007         MX001 Abarrotes 24/06/2020 20:26:19                           LALA
## 3008         MX001 Abarrotes 21/06/2020 22:22:35                       DIAMANTE
## 3009         MX001 Abarrotes 21/06/2020 22:32:25                     TOPO CHICO
## 3010         MX001 Abarrotes 24/06/2020 20:27:03                VELADORA MEXICO
## 3011         MX001 Abarrotes 24/06/2020 20:27:03                          BIMBO
## 3012         MX001 Abarrotes 24/06/2020 20:27:03                          BIMBO
## 3013         MX001 Abarrotes 21/06/2020 22:33:13                          PEPSI
## 3014         MX001 Abarrotes 24/06/2020 20:28:40                         TECATE
## 3015         MX001 Abarrotes 24/06/2020 20:29:31                          BIMBO
## 3016         MX001 Abarrotes 21/06/2020 22:34:48                          BIMBO
## 3017         MX001 Abarrotes 24/06/2020 20:29:31                       SABRITAS
## 3018         MX001 Abarrotes 24/06/2020 20:29:31                       JARRITOS
## 3019         MX001 Abarrotes 21/06/2020 22:35:37                      COCA COLA
## 3020         MX001 Abarrotes 21/06/2020 22:35:37                         DAN UP
## 3021         MX001 Abarrotes 21/06/2020 22:36:32                          PEPSI
## 3022         MX001 Abarrotes 21/06/2020 22:36:32                        YOPLAIT
## 3023         MX001 Abarrotes 24/06/2020 20:31:04                      EL DORADO
## 3024         MX001 Abarrotes 21/06/2020 22:36:32                           LINK
## 3025         MX001 Abarrotes 24/06/2020 20:31:39                       POWERADE
## 3026         MX001 Abarrotes 24/06/2020 20:32:04                       MARLBORO
## 3027         MX001 Abarrotes 21/06/2020 22:43:50                           LALA
## 3028         MX001 Abarrotes 24/06/2020 20:32:38                          BIMBO
## 3029         MX001 Abarrotes 24/06/2020 20:32:59                      COCA COLA
## 3030         MX001 Abarrotes 21/06/2020 22:50:11                      COCA COLA
## 3031         MX001 Abarrotes 21/06/2020 22:50:11                          BIMBO
## 3032         MX001 Abarrotes 24/06/2020 20:34:07                      PALL MALL
## 3033         MX001 Abarrotes 24/06/2020 20:34:07                          HALLS
## 3034         MX001 Abarrotes 21/06/2020 22:50:11                           JOYA
## 3035         MX001 Abarrotes 24/06/2020 20:35:32                    NUTRI LECHE
## 3036         MX001 Abarrotes 24/06/2020 20:35:32                     LA COSTEÑA
## 3037         MX001 Abarrotes 21/06/2020 22:51:44                     KLEEN BEBE
## 3038         MX001 Abarrotes 21/06/2020 22:52:33                     TOPO CHICO
## 3039         MX001 Abarrotes 24/06/2020 20:36:11                      COCA COLA
## 3040         MX001 Abarrotes 21/06/2020 22:53:26                     TOPO CHICO
## 3041         MX001 Abarrotes 24/06/2020 20:36:51                          PEPSI
## 3042         MX001 Abarrotes 24/06/2020 20:37:18                    ELECTROPURA
## 3043         MX001 Abarrotes 21/06/2020 22:54:14                          AXION
## 3044         MX001 Abarrotes 21/06/2020 22:54:14                          PEPSI
## 3045         MX001 Abarrotes 24/06/2020 20:37:52                       MARLBORO
## 3046         MX001 Abarrotes 21/06/2020 22:59:47                          PEPSI
## 3047         MX001 Abarrotes 24/06/2020 20:38:40               CARNATION CLAVEL
## 3048         MX001 Abarrotes 24/06/2020 20:38:40                         NORVER
## 3049         MX001 Abarrotes 24/06/2020 20:39:33                           YOPI
## 3050         MX001 Abarrotes 24/06/2020 20:41:05                        LA FINA
## 3051         MX001 Abarrotes 24/06/2020 20:41:05                        CHEETOS
## 3052         MX001 Abarrotes 24/06/2020 20:41:05                          LUCAS
## 3053         MX001 Abarrotes 21/06/2020 23:12:34                          PEPSI
## 3054         MX001 Abarrotes 24/06/2020 20:48:17                          PEPSI
## 3055         MX001 Abarrotes 24/06/2020 20:48:17                      LA SIERRA
## 3056         MX001 Abarrotes 21/06/2020 23:14:30                           EPIX
## 3057         MX001 Abarrotes 24/06/2020 20:48:50                       MARLBORO
## 3058         MX001 Abarrotes 21/06/2020 23:15:06                          EPURA
## 3059         MX001 Abarrotes 21/06/2020 23:15:29                    RANCHERITOS
## 3060         MX001 Abarrotes 24/06/2020 20:53:38                        DORITOS
## 3061         MX001 Abarrotes 21/06/2020 23:16:58                            SOL
## 3062         MX001 Abarrotes 24/06/2020 20:53:38                       GATORADE
## 3063         MX001 Abarrotes 24/06/2020 20:53:38                          PEPSI
## 3064         MX001 Abarrotes 24/06/2020 20:54:04                VELADORA MEXICO
## 3065         MX001 Abarrotes 24/06/2020 20:54:21                       MARINELA
## 3066         MX001 Abarrotes 24/06/2020 20:54:57                VELADORA MEXICO
## 3067         MX001 Abarrotes 24/06/2020 20:55:15                      COCA COLA
## 3068         MX001 Abarrotes 24/06/2020 20:55:15                          BIMBO
## 3069         MX001 Abarrotes 24/06/2020 21:01:40                BENSON & HEDGES
## 3070         MX001 Abarrotes 24/06/2020 21:01:40                        CHEETOS
## 3071         MX001 Abarrotes 21/06/2020 23:21:40                         NORVER
## 3072         MX001 Abarrotes 21/06/2020 23:25:19                      COCA COLA
## 3073         MX001 Abarrotes 21/06/2020 23:25:19                           LALA
## 3074         MX001 Abarrotes 24/06/2020 21:20:29                          PEPSI
## 3075         MX001 Abarrotes 24/06/2020 21:20:45                    NUTRI LECHE
## 3076         MX001 Abarrotes 24/06/2020 21:21:41                           JOYA
## 3077         MX001 Abarrotes 24/06/2020 21:21:41                           LALA
## 3078         MX001 Abarrotes 21/06/2020 23:26:51                          PEPSI
## 3079         MX001 Abarrotes 24/06/2020 21:21:41                      COCA COLA
## 3080         MX001 Abarrotes 24/06/2020 21:23:38                          LUCAS
## 3081         MX001 Abarrotes 21/06/2020 23:32:40                  TOPITOS (BK2)
## 3082         MX001 Abarrotes 24/06/2020 21:25:52                       MARINELA
## 3083         MX001 Abarrotes 24/06/2020 21:25:52                        RUFFLES
## 3084         MX001 Abarrotes 21/06/2020 23:32:40                       MARINELA
## 3085         MX001 Abarrotes 21/06/2020 23:32:40                      COCA COLA
## 3086         MX001 Abarrotes 21/06/2020 23:32:40                       KOLALOKA
## 3087         MX001 Abarrotes 24/06/2020 21:27:11                        RUFFLES
## 3088         MX001 Abarrotes 21/06/2020 23:33:16                        DORITOS
## 3089         MX001 Abarrotes 24/06/2020 21:27:11                    PAPIRRINGAS
## 3090         MX001 Abarrotes 24/06/2020 21:27:11                          PEPSI
## 3091         MX001 Abarrotes 21/06/2020 23:33:31                        BOKADOS
## 3092         MX001 Abarrotes 24/06/2020 21:33:23                    PEPSI LIGHT
## 3093         MX001 Abarrotes 21/06/2020 23:43:02                      COCA COLA
## 3094         MX001 Abarrotes 21/06/2020 23:43:02                 COCA COLA ZERO
## 3095         MX001 Abarrotes 21/06/2020 23:43:38                       GATORADE
## 3096         MX001 Abarrotes 24/06/2020 21:38:34                        TRIDENT
## 3097         MX001 Abarrotes 24/06/2020 21:39:12                      COCA COLA
## 3098         MX001 Abarrotes 24/06/2020 21:43:42                          BIMBO
## 3099         MX001 Abarrotes 24/06/2020 21:44:53                     VALLE FRUT
## 3100         MX001 Abarrotes 24/06/2020 21:48:35                           LALA
## 3101         MX001 Abarrotes 24/06/2020 21:55:48                      COCA COLA
## 3102         MX001 Abarrotes 24/06/2020 22:00:30             SALADITAS (GAMESA)
## 3103         MX001 Abarrotes 21/06/2020 23:59:46                        CHEETOS
## 3104         MX001 Abarrotes 24/06/2020 22:00:30                      PALL MALL
## 3105         MX001 Abarrotes 24/06/2020 22:00:30                       GILLETTE
## 3106         MX001 Abarrotes 24/06/2020 22:01:20                          BIMBO
## 3107         MX001 Abarrotes 24/06/2020 22:01:20                     VALLE FRUT
## 3108         MX001 Abarrotes 22/06/2020 00:01:07                       SABRITAS
## 3109         MX001 Abarrotes 22/06/2020 00:01:07                        RUFFLES
## 3110         MX001 Abarrotes 22/06/2020 00:01:07                       SABRITAS
## 3111         MX001 Abarrotes 24/06/2020 22:01:45                       SABRITAS
## 3112         MX001 Abarrotes 24/06/2020 22:01:45                       SABRITAS
## 3113         MX001 Abarrotes 22/06/2020 00:04:01                       MARUCHAN
## 3114         MX001 Abarrotes 22/06/2020 00:04:01                          PEPSI
## 3115         MX001 Abarrotes 24/06/2020 22:13:46                          LUCAS
## 3116         MX001 Abarrotes 22/06/2020 00:09:56                          PEPSI
## 3117         MX001 Abarrotes 24/06/2020 22:19:20                CREMAX DE NIEVE
## 3118         MX001 Abarrotes 24/06/2020 22:19:20                           LALA
## 3119         MX001 Abarrotes 22/06/2020 00:10:27                       MARLBORO
## 3120         MX001 Abarrotes 24/06/2020 22:19:50                           GIRO
## 3121         MX001 Abarrotes 24/06/2020 22:20:13                BENSON & HEDGES
## 3122         MX001 Abarrotes 24/06/2020 22:20:13                       MARLBORO
## 3123         MX001 Abarrotes 24/06/2020 22:20:13                      COCA COLA
## 3124         MX001 Abarrotes 24/06/2020 22:20:13                       TOSTITOS
## 3125         MX001 Abarrotes 22/06/2020 00:11:17                COCA COLA LIGHT
## 3126         MX001 Abarrotes 24/06/2020 22:23:32                        BOKADOS
## 3127         MX001 Abarrotes 24/06/2020 22:24:13                         ACT II
## 3128         MX001 Abarrotes 24/06/2020 22:24:13                           TANG
## 3129         MX001 Abarrotes 24/06/2020 22:34:12                        CHEETOS
## 3130         MX001 Abarrotes 24/06/2020 22:35:19                           LALA
## 3131         MX001 Abarrotes 22/06/2020 00:15:26                           LINK
## 3132         MX001 Abarrotes 22/06/2020 00:19:07                       MARINELA
## 3133         MX001 Abarrotes 22/06/2020 00:19:07                       PAKETAXO
## 3134         MX001 Abarrotes 22/06/2020 00:19:07                         CHOKIS
## 3135         MX001 Abarrotes 24/06/2020 22:54:16                       MARINELA
## 3136         MX001 Abarrotes 24/06/2020 23:12:13                        BOKADOS
## 3137         MX001 Abarrotes 24/06/2020 23:13:09                        DORITOS
## 3138         MX001 Abarrotes 24/06/2020 23:13:09                        DORITOS
## 3139         MX001 Abarrotes 22/06/2020 00:22:18                           LALA
## 3140         MX001 Abarrotes 24/06/2020 23:13:09                          PEPSI
## 3141         MX001 Abarrotes 22/06/2020 00:23:39                      COCA COLA
## 3142         MX001 Abarrotes 22/06/2020 00:23:39                           LALA
## 3143         MX001 Abarrotes 22/06/2020 00:23:39                      COCA COLA
## 3144         MX001 Abarrotes 22/06/2020 00:23:39                          EPURA
## 3145         MX001 Abarrotes 24/06/2020 23:14:54                        MASSISO
## 3146         MX001 Abarrotes 22/06/2020 00:24:04                       MARLBORO
## 3147         MX001 Abarrotes 24/06/2020 23:16:19                       TOSTILEO
## 3148         MX001 Abarrotes 24/06/2020 23:16:19                        DORITOS
## 3149         MX001 Abarrotes 24/06/2020 23:16:19                        CHEETOS
## 3150         MX001 Abarrotes 24/06/2020 23:16:19                       NUTRIOLI
## 3151         MX001 Abarrotes 24/06/2020 23:32:42                         ACT II
## 3152         MX001 Abarrotes 22/06/2020 00:31:38                        RUFFLES
## 3153         MX001 Abarrotes 22/06/2020 00:31:38                     SABRITONES
## 3154         MX001 Abarrotes 24/06/2020 23:33:25                           LALA
## 3155         MX001 Abarrotes 22/06/2020 00:33:05                           NIDO
## 3156         MX001 Abarrotes 24/06/2020 23:34:17                         JALOMA
## 3157         MX001 Abarrotes 24/06/2020 23:34:53                          BIMBO
## 3158         MX001 Abarrotes 24/06/2020 23:34:53                          BIMBO
## 3159         MX001 Abarrotes 24/06/2020 23:36:26                          HALLS
## 3160         MX001 Abarrotes 22/06/2020 01:00:21                         SQUIRT
## 3161         MX001 Abarrotes 24/06/2020 23:38:16                          BIMBO
## 3162         MX001 Abarrotes 24/06/2020 23:38:16                          PEPSI
## 3163         MX001 Abarrotes 24/06/2020 23:40:52                           TANG
## 3164         MX001 Abarrotes 25/06/2020 00:01:12                    PEPSI LIGHT
## 3165         MX001 Abarrotes 22/06/2020 08:15:42                      COCA COLA
## 3166         MX001 Abarrotes 22/06/2020 08:42:33                          BIMBO
## 3167         MX001 Abarrotes 25/06/2020 10:22:42                          BIMBO
## 3168         MX001 Abarrotes 22/06/2020 08:42:33                      COCA COLA
## 3169         MX001 Abarrotes 25/06/2020 10:22:42                          BIMBO
## 3170         MX001 Abarrotes 25/06/2020 10:23:36                      COCA COLA
## 3171         MX001 Abarrotes 22/06/2020 08:53:17                      PALMOLIVE
## 3172         MX001 Abarrotes 25/06/2020 10:25:54                          BIMBO
## 3173         MX001 Abarrotes 25/06/2020 10:25:54                     VALLE FRUT
## 3174         MX001 Abarrotes 25/06/2020 10:26:20           MAZAPAN AZTECA (BK2)
## 3175         MX001 Abarrotes 22/06/2020 08:55:38                      PALMOLIVE
## 3176         MX001 Abarrotes 22/06/2020 09:09:59                      CONVERMEX
## 3177         MX001 Abarrotes 22/06/2020 09:12:45                          PEPSI
## 3178         MX001 Abarrotes 25/06/2020 10:30:11                          PEPSI
## 3179         MX001 Abarrotes 25/06/2020 10:33:33                           LALA
## 3180         MX001 Abarrotes 25/06/2020 10:33:33                          BIMBO
## 3181         MX001 Abarrotes 22/06/2020 09:29:16                    NUTRI LECHE
## 3182         MX001 Abarrotes 25/06/2020 10:35:34                      COCA COLA
## 3183         MX001 Abarrotes 22/06/2020 09:32:23                       GATORADE
## 3184         MX001 Abarrotes 22/06/2020 09:42:01                          PEPSI
## 3185         MX001 Abarrotes 22/06/2020 09:43:37                         CHOKIS
## 3186         MX001 Abarrotes 22/06/2020 09:43:37                    NUTRI LECHE
## 3187         MX001 Abarrotes 25/06/2020 10:40:48                          PEPSI
## 3188         MX001 Abarrotes 22/06/2020 09:58:34                    NUTRI LECHE
## 3189         MX001 Abarrotes 22/06/2020 10:01:25                      COCA COLA
## 3190         MX001 Abarrotes 22/06/2020 10:03:02                           LINK
## 3191         MX001 Abarrotes 25/06/2020 10:55:45                      COCA COLA
## 3192         MX001 Abarrotes 25/06/2020 10:55:45                          EPURA
## 3193         MX001 Abarrotes 22/06/2020 10:08:30                     SABRITONES
## 3194         MX001 Abarrotes 22/06/2020 10:21:35                          PEPSI
## 3195         MX001 Abarrotes 22/06/2020 10:21:35                         GERBER
## 3196         MX001 Abarrotes 25/06/2020 11:05:46                          PEPSI
## 3197         MX001 Abarrotes 22/06/2020 10:22:56                          EPURA
## 3198         MX001 Abarrotes 22/06/2020 10:27:15                      COCA COLA
## 3199         MX001 Abarrotes 25/06/2020 11:19:41                          PEPSI
## 3200         MX001 Abarrotes 22/06/2020 10:49:43                       KOLALOKA
## 3201         MX001 Abarrotes 25/06/2020 11:40:01                          PEPSI
## 3202         MX001 Abarrotes 25/06/2020 11:42:01                    5 ESTRELLAS
## 3203         MX001 Abarrotes 25/06/2020 11:44:16                       FABULOSO
## 3204         MX001 Abarrotes 22/06/2020 10:56:20                          PEPSI
## 3205         MX001 Abarrotes 25/06/2020 11:44:16                       CLORALEX
## 3206         MX001 Abarrotes 25/06/2020 11:44:16                       MARLBORO
## 3207         MX001 Abarrotes 22/06/2020 10:56:44                          PEPSI
## 3208         MX001 Abarrotes 22/06/2020 11:04:08                    NUTRI LECHE
## 3209         MX001 Abarrotes 25/06/2020 11:50:00                          PEPSI
## 3210         MX001 Abarrotes 22/06/2020 11:06:43                          PEPSI
## 3211         MX001 Abarrotes 22/06/2020 11:11:37                COCA COLA LIGHT
## 3212         MX001 Abarrotes 22/06/2020 11:11:37                      COCA COLA
## 3213         MX001 Abarrotes 22/06/2020 11:13:01                           LALA
## 3214         MX001 Abarrotes 22/06/2020 11:13:01                          BIMBO
## 3215         MX001 Abarrotes 25/06/2020 11:54:18                      CONSOMATE
## 3216         MX001 Abarrotes 25/06/2020 11:54:18                           TANG
## 3217         MX001 Abarrotes 22/06/2020 11:13:59                      COCA COLA
## 3218         MX001 Abarrotes 22/06/2020 11:13:59                          BIMBO
## 3219         MX001 Abarrotes 25/06/2020 11:57:15                          PEPSI
## 3220         MX001 Abarrotes 25/06/2020 11:57:15                      DEL PRIMO
## 3221         MX001 Abarrotes 22/06/2020 11:18:31     BLANCA NIEVES (DETERGENTE)
## 3222         MX001 Abarrotes 22/06/2020 11:19:18                          PEPSI
## 3223         MX001 Abarrotes 22/06/2020 11:19:41                         FRUTSI
## 3224         MX001 Abarrotes 25/06/2020 12:01:52                          PEPSI
## 3225         MX001 Abarrotes 25/06/2020 12:11:42                          PEPSI
## 3226         MX001 Abarrotes 25/06/2020 12:12:09                          PEPSI
## 3227         MX001 Abarrotes 25/06/2020 12:12:09                      CONSOMATE
## 3228         MX001 Abarrotes 25/06/2020 12:15:46                          BIMBO
## 3229         MX001 Abarrotes 22/06/2020 11:22:05                    PEPSI LIGHT
## 3230         MX001 Abarrotes 25/06/2020 12:15:46                      DEL VALLE
## 3231         MX001 Abarrotes 25/06/2020 13:46:52                        CHEETOS
## 3232         MX001 Abarrotes 25/06/2020 13:46:52                         DANONE
## 3233         MX001 Abarrotes 22/06/2020 11:23:22                COCA COLA LIGHT
## 3234         MX001 Abarrotes 22/06/2020 11:23:46                         NEVADA
## 3235         MX001 Abarrotes 25/06/2020 13:48:00                     DOÑA MARIA
## 3236         MX001 Abarrotes 22/06/2020 11:25:50                      COCA COLA
## 3237         MX001 Abarrotes 22/06/2020 11:27:27                          EPURA
## 3238         MX001 Abarrotes 22/06/2020 11:28:22                        CHEETOS
## 3239         MX001 Abarrotes 25/06/2020 13:52:02                          PEPSI
## 3240         MX001 Abarrotes 22/06/2020 11:32:52                      COCA COLA
## 3241         MX001 Abarrotes 22/06/2020 11:32:52                         GAMESA
## 3242         MX001 Abarrotes 22/06/2020 11:32:52                          MAMUT
## 3243         MX001 Abarrotes 22/06/2020 11:32:52                     DOÑA MARIA
## 3244         MX001 Abarrotes 25/06/2020 13:52:39                          PEPSI
## 3245         MX001 Abarrotes 22/06/2020 11:32:52                           TANG
## 3246         MX001 Abarrotes 22/06/2020 11:32:52                        MAZATUN
## 3247         MX001 Abarrotes 22/06/2020 11:32:52                       DIAMANTE
## 3248         MX001 Abarrotes 22/06/2020 11:33:22                          BIMBO
## 3249         MX001 Abarrotes 25/06/2020 14:00:02                          AXION
## 3250         MX001 Abarrotes 22/06/2020 11:33:22                    5 ESTRELLAS
## 3251         MX001 Abarrotes 25/06/2020 14:20:10                     DEL FUERTE
## 3252         MX001 Abarrotes 22/06/2020 11:34:08                      NORTEÑITA
## 3253         MX001 Abarrotes 25/06/2020 14:42:29                          BOING
## 3254         MX001 Abarrotes 25/06/2020 14:42:29                      COCA COLA
## 3255         MX001 Abarrotes 22/06/2020 11:39:21                          BIMBO
## 3256         MX001 Abarrotes 22/06/2020 11:42:24                          PEPSI
## 3257         MX001 Abarrotes 25/06/2020 14:45:51                  MANZANITA SOL
## 3258         MX001 Abarrotes 22/06/2020 11:43:23     BLANCA NIEVES (DETERGENTE)
## 3259         MX001 Abarrotes 25/06/2020 14:51:51                        CRISTAL
## 3260         MX001 Abarrotes 22/06/2020 11:44:45                           LALA
## 3261         MX001 Abarrotes 22/06/2020 11:45:55                      COCA COLA
## 3262         MX001 Abarrotes 22/06/2020 11:46:24             SALADITAS (GAMESA)
## 3263         MX001 Abarrotes 22/06/2020 11:46:24                      DEL VALLE
## 3264         MX001 Abarrotes 22/06/2020 11:46:24                          PULPY
## 3265         MX001 Abarrotes 25/06/2020 15:31:21                           TANG
## 3266         MX001 Abarrotes 25/06/2020 15:34:59                        RUFFLES
## 3267         MX001 Abarrotes 25/06/2020 15:34:59                        YOPLAIT
## 3268         MX001 Abarrotes 25/06/2020 15:34:59                       MARUCHAN
## 3269         MX001 Abarrotes 25/06/2020 15:34:59                          FANTA
## 3270         MX001 Abarrotes 22/06/2020 11:52:23                           FOCA
## 3271         MX001 Abarrotes 25/06/2020 15:37:09                        RUFFLES
## 3272         MX001 Abarrotes 25/06/2020 15:37:09                       TOSTITOS
## 3273         MX001 Abarrotes 25/06/2020 15:37:09                       TOSTITOS
## 3274         MX001 Abarrotes 25/06/2020 15:37:09                      COCA COLA
## 3275         MX001 Abarrotes 22/06/2020 11:58:16     BLANCA NIEVES (DETERGENTE)
## 3276         MX001 Abarrotes 25/06/2020 15:37:20                          PEPSI
## 3277         MX001 Abarrotes 22/06/2020 12:01:11                      COCA COLA
## 3278         MX001 Abarrotes 25/06/2020 15:39:48                        CHEETOS
## 3279         MX001 Abarrotes 25/06/2020 15:39:48                    PAPIRRINGAS
## 3280         MX001 Abarrotes 25/06/2020 15:39:48                           TANG
## 3281         MX001 Abarrotes 22/06/2020 12:03:58                      COCA COLA
## 3282         MX001 Abarrotes 25/06/2020 15:39:48                           TANG
## 3283         MX001 Abarrotes 25/06/2020 15:41:07                          BIMBO
## 3284         MX001 Abarrotes 25/06/2020 15:41:07                      COCA COLA
## 3285         MX001 Abarrotes 22/06/2020 12:06:04                      COCA COLA
## 3286         MX001 Abarrotes 22/06/2020 12:06:04                          AXION
## 3287         MX001 Abarrotes 25/06/2020 15:41:40                        CHEETOS
## 3288         MX001 Abarrotes 25/06/2020 15:41:40                          PEPSI
## 3289         MX001 Abarrotes 22/06/2020 12:30:52                          PEPSI
## 3290         MX001 Abarrotes 22/06/2020 13:16:37                EL GALLO DE ORO
## 3291         MX001 Abarrotes 22/06/2020 13:16:58                      COCA COLA
## 3292         MX001 Abarrotes 22/06/2020 13:20:43                      COCA COLA
## 3293         MX001 Abarrotes 25/06/2020 15:47:10                      COCA COLA
## 3294         MX001 Abarrotes 25/06/2020 15:47:10                          BIMBO
## 3295         MX001 Abarrotes 25/06/2020 15:47:10                          EPURA
## 3296         MX001 Abarrotes 22/06/2020 13:28:49                        RUFFLES
## 3297         MX001 Abarrotes 25/06/2020 15:47:59                      COCA COLA
## 3298         MX001 Abarrotes 22/06/2020 13:28:49                      COCA COLA
## 3299         MX001 Abarrotes 25/06/2020 15:49:52                           LALA
## 3300         MX001 Abarrotes 25/06/2020 15:50:34                      CONSOMATE
## 3301         MX001 Abarrotes 22/06/2020 13:35:32                    NUTRI LECHE
## 3302         MX001 Abarrotes 22/06/2020 13:36:27                          BIMBO
## 3303         MX001 Abarrotes 22/06/2020 13:36:27                           LALA
## 3304         MX001 Abarrotes 22/06/2020 13:41:44                          BIMBO
## 3305         MX001 Abarrotes 22/06/2020 13:41:44                       POWERADE
## 3306         MX001 Abarrotes 25/06/2020 15:52:09                      COCA COLA
## 3307         MX001 Abarrotes 22/06/2020 13:43:16                           GIRO
## 3308         MX001 Abarrotes 25/06/2020 15:54:16             CHEESE PUFFS (LEO)
## 3309         MX001 Abarrotes 22/06/2020 14:04:22                      COCA COLA
## 3310         MX001 Abarrotes 25/06/2020 15:56:20                         GERBER
## 3311         MX001 Abarrotes 22/06/2020 14:06:41                       FABULOSO
## 3312         MX001 Abarrotes 25/06/2020 15:58:34                          PEPSI
## 3313         MX001 Abarrotes 25/06/2020 15:59:57                      CONSOMATE
## 3314         MX001 Abarrotes 22/06/2020 14:16:14                          JUMEX
## 3315         MX001 Abarrotes 22/06/2020 14:16:14                          JUMEX
## 3316         MX001 Abarrotes 22/06/2020 14:16:14                           LALA
## 3317         MX001 Abarrotes 25/06/2020 16:00:18                          PEPSI
## 3318         MX001 Abarrotes 22/06/2020 14:16:50                          FLASH
## 3319         MX001 Abarrotes 22/06/2020 14:16:50                           FOCA
## 3320         MX001 Abarrotes 22/06/2020 14:17:07                       BIG COLA
## 3321         MX001 Abarrotes 25/06/2020 17:06:54                        CHEETOS
## 3322         MX001 Abarrotes 25/06/2020 17:11:23                      CONSOMATE
## 3323         MX001 Abarrotes 25/06/2020 17:16:19                      COCA COLA
## 3324         MX001 Abarrotes 22/06/2020 14:20:52             SALADITAS (GAMESA)
## 3325         MX001 Abarrotes 25/06/2020 17:22:06                          PEPSI
## 3326         MX001 Abarrotes 22/06/2020 14:20:52                          PEPSI
## 3327         MX001 Abarrotes 25/06/2020 17:22:26                        CHEETOS
## 3328         MX001 Abarrotes 25/06/2020 17:22:56                        DORITOS
## 3329         MX001 Abarrotes 25/06/2020 18:01:22                     TOPO CHICO
## 3330         MX001 Abarrotes 22/06/2020 14:24:42                       SABRITAS
## 3331         MX001 Abarrotes 25/06/2020 18:01:22                           LALA
## 3332         MX001 Abarrotes 22/06/2020 14:24:42                      COCA COLA
## 3333         MX001 Abarrotes 22/06/2020 14:44:44                       MARUCHAN
## 3334         MX001 Abarrotes 25/06/2020 18:21:56                           ZUKO
## 3335         MX001 Abarrotes 25/06/2020 18:27:08                       CLORALEX
## 3336         MX001 Abarrotes 22/06/2020 14:47:25                          BIMBO
## 3337         MX001 Abarrotes 22/06/2020 14:48:11                        CHEETOS
## 3338         MX001 Abarrotes 25/06/2020 18:29:46                      COCA COLA
## 3339         MX001 Abarrotes 22/06/2020 14:49:04                           LALA
## 3340         MX001 Abarrotes 22/06/2020 14:49:39                        MIRINDA
## 3341         MX001 Abarrotes 25/06/2020 20:26:14                       MARUCHAN
## 3342         MX001 Abarrotes 22/06/2020 14:50:15                         SQUIRT
## 3343         MX001 Abarrotes 25/06/2020 20:26:47                          PEPSI
## 3344         MX001 Abarrotes 22/06/2020 14:52:26                         CHIMEX
## 3345         MX001 Abarrotes 25/06/2020 20:27:07                      NORTEÑITA
## 3346         MX001 Abarrotes 25/06/2020 20:27:55                           LALA
## 3347         MX001 Abarrotes 25/06/2020 20:27:55                         CHIMEX
## 3348         MX001 Abarrotes 22/06/2020 15:02:58                       POWERADE
## 3349         MX001 Abarrotes 22/06/2020 15:09:33                          PEPSI
## 3350         MX001 Abarrotes 22/06/2020 15:10:56                      NORTEÑITA
## 3351         MX001 Abarrotes 22/06/2020 15:15:58                       GATORADE
## 3352         MX001 Abarrotes 25/06/2020 20:36:03                        KINDER 
## 3353         MX001 Abarrotes 25/06/2020 20:40:20                VELADORA MEXICO
## 3354         MX001 Abarrotes 22/06/2020 15:18:38                     TOPO CHICO
## 3355         MX001 Abarrotes 22/06/2020 15:20:01                          PEPSI
## 3356         MX001 Abarrotes 22/06/2020 15:20:44                         FRESCA
## 3357         MX001 Abarrotes 22/06/2020 15:20:44                           TANG
## 3358         MX001 Abarrotes 25/06/2020 21:12:14                        LA FINA
## 3359         MX001 Abarrotes 25/06/2020 21:12:14                    PEPSI LIGHT
## 3360         MX001 Abarrotes 25/06/2020 21:13:10                          PEPSI
## 3361         MX001 Abarrotes 22/06/2020 15:23:27                           LINK
## 3362         MX001 Abarrotes 22/06/2020 15:23:27                      LA SIERRA
## 3363         MX001 Abarrotes 25/06/2020 21:16:30                          BIMBO
## 3364         MX001 Abarrotes 22/06/2020 15:24:18             SALADITAS (GAMESA)
## 3365         MX001 Abarrotes 25/06/2020 21:16:30                        DORITOS
## 3366         MX001 Abarrotes 22/06/2020 15:24:55                       COLGATE 
## 3367         MX001 Abarrotes 25/06/2020 21:19:32                        BOKADOS
## 3368         MX001 Abarrotes 22/06/2020 15:26:17                      COCA COLA
## 3369         MX001 Abarrotes 25/06/2020 21:23:48                   BUBBA XTREME
## 3370         MX001 Abarrotes 22/06/2020 15:27:21                      COCA COLA
## 3371         MX001 Abarrotes 25/06/2020 21:24:07                      DEL CAMPO
## 3372         MX001 Abarrotes 25/06/2020 21:24:41                EL GALLO DE ORO
## 3373         MX001 Abarrotes 25/06/2020 21:28:18                           LINK
## 3374         MX001 Abarrotes 22/06/2020 15:59:47                      COCA COLA
## 3375         MX001 Abarrotes 22/06/2020 16:01:28                         VELVET
## 3376         MX001 Abarrotes 22/06/2020 16:01:28                         NORVER
## 3377         MX001 Abarrotes 22/06/2020 16:02:44                         FRUTSI
## 3378         MX001 Abarrotes 22/06/2020 16:02:44                          BIMBO
## 3379         MX001 Abarrotes 22/06/2020 16:02:44                           LALA
## 3380         MX001 Abarrotes 25/06/2020 21:30:07                       PEDIGREE
## 3381         MX001 Abarrotes 22/06/2020 16:02:44                          BIMBO
## 3382         MX001 Abarrotes 22/06/2020 16:02:44                          PEPSI
## 3383         MX001 Abarrotes 25/06/2020 21:30:07                         NESTLE
## 3384         MX001 Abarrotes 25/06/2020 21:31:00                   BUBBA XTREME
## 3385         MX001 Abarrotes 22/06/2020 16:07:09                      COCA COLA
## 3386         MX001 Abarrotes 22/06/2020 16:07:09                        ENSUEÑO
## 3387         MX001 Abarrotes 25/06/2020 22:46:51                        DORITOS
## 3388         MX001 Abarrotes 25/06/2020 22:47:30                      COCA COLA
## 3389         MX001 Abarrotes 22/06/2020 16:11:54                          JUMEX
## 3390         MX001 Abarrotes 25/06/2020 22:47:30                    PERMA SHARP
## 3391         MX001 Abarrotes 22/06/2020 16:11:54                      COCA COLA
## 3392         MX001 Abarrotes 25/06/2020 22:48:43                        ENCANTO
## 3393         MX001 Abarrotes 22/06/2020 16:13:13                      COCA COLA
## 3394         MX001 Abarrotes 25/06/2020 22:49:12                        CHEETOS
## 3395         MX001 Abarrotes 22/06/2020 16:13:27                      COCA COLA
## 3396         MX001 Abarrotes 25/06/2020 22:49:12                          EPURA
## 3397         MX001 Abarrotes 22/06/2020 16:15:02                          PEPSI
## 3398         MX001 Abarrotes 25/06/2020 23:06:32                  TOPITOS (BK2)
## 3399         MX001 Abarrotes 25/06/2020 23:06:32                          BIMBO
## 3400         MX001 Abarrotes 25/06/2020 23:09:53                     VALLE FRUT
## 3401         MX001 Abarrotes 25/06/2020 23:11:31                    FROOT LOOPS
## 3402         MX001 Abarrotes 25/06/2020 23:11:31                    NUTRI LECHE
## 3403         MX001 Abarrotes 25/06/2020 23:11:31                          PEPSI
## 3404         MX001 Abarrotes 25/06/2020 23:11:31                         CHIMEX
## 3405         MX001 Abarrotes 22/06/2020 16:20:05                  MANZANITA SOL
## 3406         MX001 Abarrotes 26/06/2020 00:10:47                        MIRINDA
## 3407         MX001 Abarrotes 26/06/2020 00:13:44                      COCA COLA
## 3408         MX001 Abarrotes 26/06/2020 00:14:31                         DANONE
## 3409         MX001 Abarrotes 26/06/2020 00:14:31                      COCA COLA
## 3410         MX001 Abarrotes 22/06/2020 16:26:46                      COCA COLA
## 3411         MX001 Abarrotes 22/06/2020 16:31:27                        CLAMATO
## 3412         MX001 Abarrotes 22/06/2020 16:35:15                        CHEETOS
## 3413         MX001 Abarrotes 26/06/2020 00:23:38                          PEPSI
## 3414         MX001 Abarrotes 22/06/2020 16:36:03                          PEPSI
## 3415         MX001 Abarrotes 26/06/2020 00:28:30                      COCA COLA
## 3416         MX001 Abarrotes 26/06/2020 00:28:30                        KINDER 
## 3417         MX001 Abarrotes 22/06/2020 16:37:43                        MIRINDA
## 3418         MX001 Abarrotes 26/06/2020 00:34:02                          FANTA
## 3419         MX001 Abarrotes 26/06/2020 08:13:07                          BIMBO
## 3420         MX001 Abarrotes 22/06/2020 16:42:58                        CAMELIA
## 3421         MX001 Abarrotes 22/06/2020 16:44:34                      COCA COLA
## 3422         MX001 Abarrotes 26/06/2020 08:36:57                      COCA COLA
## 3423         MX001 Abarrotes 22/06/2020 16:46:27                      COCA COLA
## 3424         MX001 Abarrotes 26/06/2020 08:42:50                           FOCA
## 3425         MX001 Abarrotes 22/06/2020 16:48:14                     VALLE FRUT
## 3426         MX001 Abarrotes 22/06/2020 16:54:07                          PEPSI
## 3427         MX001 Abarrotes 22/06/2020 16:54:22                          PEPSI
## 3428         MX001 Abarrotes 22/06/2020 16:54:22                      DEL MONTE
## 3429         MX001 Abarrotes 22/06/2020 16:56:02                        RUFFLES
## 3430         MX001 Abarrotes 26/06/2020 09:19:32                        YOPLAIT
## 3431         MX001 Abarrotes 22/06/2020 16:56:39                          PEPSI
## 3432         MX001 Abarrotes 22/06/2020 16:56:39                       CLORALEX
## 3433         MX001 Abarrotes 26/06/2020 09:26:36              EMPERADOR (SENZO)
## 3434         MX001 Abarrotes 26/06/2020 09:26:36                       HERSHEYS
## 3435         MX001 Abarrotes 26/06/2020 09:26:36                          BIMBO
## 3436         MX001 Abarrotes 26/06/2020 09:58:38                      COCA COLA
## 3437         MX001 Abarrotes 22/06/2020 16:59:44                      COCA COLA
## 3438         MX001 Abarrotes 26/06/2020 09:59:31                          PEPSI
## 3439         MX001 Abarrotes 22/06/2020 16:59:44                          PEPSI
## 3440         MX001 Abarrotes 26/06/2020 10:00:43                          BIMBO
## 3441         MX001 Abarrotes 26/06/2020 10:00:43                          PEPSI
## 3442         MX001 Abarrotes 22/06/2020 17:01:52                       MARUCHAN
## 3443         MX001 Abarrotes 22/06/2020 17:01:52     BLANCA NIEVES (DETERGENTE)
## 3444         MX001 Abarrotes 22/06/2020 17:01:52                         DANONE
## 3445         MX001 Abarrotes 22/06/2020 17:02:03                      COCA COLA
## 3446         MX001 Abarrotes 26/06/2020 10:02:49                    5 ESTRELLAS
## 3447         MX001 Abarrotes 26/06/2020 12:05:24                          PEPSI
## 3448         MX001 Abarrotes 26/06/2020 12:12:14                          PEPSI
## 3449         MX001 Abarrotes 26/06/2020 12:15:09                        LOL-TUN
## 3450         MX001 Abarrotes 26/06/2020 12:22:53                     DOÑA MARIA
## 3451         MX001 Abarrotes 26/06/2020 12:22:53                      COCA COLA
## 3452         MX001 Abarrotes 26/06/2020 12:25:24                          PEPSI
## 3453         MX001 Abarrotes 22/06/2020 17:06:32                      LA SIERRA
## 3454         MX001 Abarrotes 22/06/2020 17:06:32                      NORTEÑITA
## 3455         MX001 Abarrotes 22/06/2020 17:07:07                      COCA COLA
## 3456         MX001 Abarrotes 22/06/2020 17:08:08                      COCA COLA
## 3457         MX001 Abarrotes 22/06/2020 17:08:08                          BIMBO
## 3458         MX001 Abarrotes 22/06/2020 17:08:08                     SABRITONES
## 3459         MX001 Abarrotes 22/06/2020 17:08:08                      CONVERMEX
## 3460         MX001 Abarrotes 26/06/2020 13:00:34                        RUFFLES
## 3461         MX001 Abarrotes 26/06/2020 13:00:34                        DORITOS
## 3462         MX001 Abarrotes 22/06/2020 17:09:20                       BONAFONT
## 3463         MX001 Abarrotes 22/06/2020 17:09:33                           INCA
## 3464         MX001 Abarrotes 26/06/2020 13:13:19                      COCA COLA
## 3465         MX001 Abarrotes 22/06/2020 17:12:33                          PEPSI
## 3466         MX001 Abarrotes 26/06/2020 13:14:46                      COCA COLA
## 3467         MX001 Abarrotes 22/06/2020 17:15:05                            ACE
## 3468         MX001 Abarrotes 22/06/2020 17:15:05                       FRUTIMAX
## 3469         MX001 Abarrotes 22/06/2020 17:15:49                           GIRO
## 3470         MX001 Abarrotes 22/06/2020 17:15:49                            ACE
## 3471         MX001 Abarrotes 26/06/2020 13:15:17                       SEVEN UP
## 3472         MX001 Abarrotes 22/06/2020 17:17:05                      COCA COLA
## 3473         MX001 Abarrotes 22/06/2020 17:17:23                          BIMBO
## 3474         MX001 Abarrotes 22/06/2020 17:17:23                       PAKETAXO
## 3475         MX001 Abarrotes 26/06/2020 13:32:10                     VALLE FRUT
## 3476         MX001 Abarrotes 26/06/2020 13:40:01                       PAKETAXO
## 3477         MX001 Abarrotes 26/06/2020 13:40:01                       KARTAMUS
## 3478         MX001 Abarrotes 22/06/2020 17:20:33                        KINDER 
## 3479         MX001 Abarrotes 26/06/2020 13:40:18                      COCA COLA
## 3480         MX001 Abarrotes 22/06/2020 17:21:16                         TECATE
## 3481         MX001 Abarrotes 22/06/2020 17:23:11                          BIMBO
## 3482         MX001 Abarrotes 22/06/2020 17:24:41                       TOSTILEO
## 3483         MX001 Abarrotes 26/06/2020 13:53:40                      COCA COLA
## 3484         MX001 Abarrotes 26/06/2020 13:53:40                          EPURA
## 3485         MX001 Abarrotes 22/06/2020 17:28:18                         FRUTSI
## 3486         MX001 Abarrotes 26/06/2020 13:54:25                           BABY
## 3487         MX001 Abarrotes 26/06/2020 14:01:01     BLANCA NIEVES (DETERGENTE)
## 3488         MX001 Abarrotes 26/06/2020 14:01:01                       SUAVITEL
## 3489         MX001 Abarrotes 26/06/2020 14:02:14                         MASECA
## 3490         MX001 Abarrotes 22/06/2020 17:34:56                          BIMBO
## 3491         MX001 Abarrotes 22/06/2020 17:34:56                      COCA COLA
## 3492         MX001 Abarrotes 22/06/2020 17:34:56                      CONSOMATE
## 3493         MX001 Abarrotes 26/06/2020 14:03:47                      COCA COLA
## 3494         MX001 Abarrotes 22/06/2020 17:35:49                      COCA COLA
## 3495         MX001 Abarrotes 26/06/2020 14:04:49             SALADITAS (GAMESA)
## 3496         MX001 Abarrotes 26/06/2020 14:04:49                      NORTEÑITA
## 3497         MX001 Abarrotes 22/06/2020 17:36:22                      COCA COLA
## 3498         MX001 Abarrotes 26/06/2020 14:09:46                      COCA COLA
## 3499         MX001 Abarrotes 26/06/2020 14:10:12                      DEL VALLE
## 3500         MX001 Abarrotes 22/06/2020 17:42:18                      COCA COLA
## 3501         MX001 Abarrotes 22/06/2020 17:43:10                           TANG
## 3502         MX001 Abarrotes 26/06/2020 14:20:27                      DEL MONTE
## 3503         MX001 Abarrotes 22/06/2020 17:48:53                    NUTRI LECHE
## 3504         MX001 Abarrotes 26/06/2020 14:21:34                         SQUIRT
## 3505         MX001 Abarrotes 26/06/2020 14:24:47                      DEL MONTE
## 3506         MX001 Abarrotes 26/06/2020 14:25:23                          PEPSI
## 3507         MX001 Abarrotes 22/06/2020 17:51:10                    NUTRI LECHE
## 3508         MX001 Abarrotes 26/06/2020 14:25:40                        BOKADOS
## 3509         MX001 Abarrotes 22/06/2020 17:52:13                        RUFFLES
## 3510         MX001 Abarrotes 26/06/2020 14:33:27                         GAMESA
## 3511         MX001 Abarrotes 26/06/2020 14:33:27                        SULTANA
## 3512         MX001 Abarrotes 22/06/2020 17:52:13                COCA COLA LIGHT
## 3513         MX001 Abarrotes 22/06/2020 17:52:32                        RUFFLES
## 3514         MX001 Abarrotes 22/06/2020 17:52:32                       SABRITAS
## 3515         MX001 Abarrotes 22/06/2020 17:52:32                       TOSTITOS
## 3516         MX001 Abarrotes 22/06/2020 17:54:27                       SABRITAS
## 3517         MX001 Abarrotes 22/06/2020 17:54:27                        DORITOS
## 3518         MX001 Abarrotes 22/06/2020 17:55:27                       CLORALEX
## 3519         MX001 Abarrotes 26/06/2020 14:47:31                           LALA
## 3520         MX001 Abarrotes 22/06/2020 17:55:58                        DORITOS
## 3521         MX001 Abarrotes 26/06/2020 14:47:31                       POWERADE
## 3522         MX001 Abarrotes 26/06/2020 14:48:10                           LINK
## 3523         MX001 Abarrotes 26/06/2020 14:48:10                           TANG
## 3524         MX001 Abarrotes 26/06/2020 14:48:30                       POWERADE
## 3525         MX001 Abarrotes 22/06/2020 17:57:34                       PAKETAXO
## 3526         MX001 Abarrotes 22/06/2020 17:57:54                     VALLE FRUT
## 3527         MX001 Abarrotes 22/06/2020 18:00:23                          PEPSI
## 3528         MX001 Abarrotes 22/06/2020 18:00:58                            ACE
## 3529         MX001 Abarrotes 26/06/2020 15:35:08                         SPRITE
## 3530         MX001 Abarrotes 22/06/2020 18:01:33                          PEPSI
## 3531         MX001 Abarrotes 26/06/2020 15:36:09             SALADITAS (GAMESA)
## 3532         MX001 Abarrotes 26/06/2020 15:36:57                           LALA
## 3533         MX001 Abarrotes 22/06/2020 18:06:56                      COCA COLA
## 3534         MX001 Abarrotes 26/06/2020 15:39:44                        ENCANTO
## 3535         MX001 Abarrotes 26/06/2020 15:39:44                        CHEETOS
## 3536         MX001 Abarrotes 22/06/2020 18:12:13                VELADORA MEXICO
## 3537         MX001 Abarrotes 26/06/2020 15:47:02                        LA FINA
## 3538         MX001 Abarrotes 26/06/2020 15:47:02                       FABULOSO
## 3539         MX001 Abarrotes 26/06/2020 15:47:02              ARCOIRIS (GAMESA)
## 3540         MX001 Abarrotes 26/06/2020 15:47:02                          BIMBO
## 3541         MX001 Abarrotes 26/06/2020 15:47:02             SALADITAS (GAMESA)
## 3542         MX001 Abarrotes 26/06/2020 15:47:02                    FROOT LOOPS
## 3543         MX001 Abarrotes 26/06/2020 15:47:02                        LOL-TUN
## 3544         MX001 Abarrotes 26/06/2020 15:47:02                            ACE
## 3545         MX001 Abarrotes 26/06/2020 15:47:02                          BIMBO
## 3546         MX001 Abarrotes 26/06/2020 15:47:02                      DEL MONTE
## 3547         MX001 Abarrotes 22/06/2020 18:14:01                       DIAMANTE
## 3548         MX001 Abarrotes 22/06/2020 18:14:55                      COCA COLA
## 3549         MX001 Abarrotes 26/06/2020 15:48:52                       TOSTITOS
## 3550         MX001 Abarrotes 26/06/2020 15:48:52                        DORITOS
## 3551         MX001 Abarrotes 22/06/2020 18:16:00                      CONSOMATE
## 3552         MX001 Abarrotes 26/06/2020 15:49:18                  MANZANITA SOL
## 3553         MX001 Abarrotes 26/06/2020 15:49:35                           JOYA
## 3554         MX001 Abarrotes 22/06/2020 18:17:53                          PEPSI
## 3555         MX001 Abarrotes 22/06/2020 18:18:10                         GERBER
## 3556         MX001 Abarrotes 22/06/2020 18:18:49                      COCA COLA
## 3557         MX001 Abarrotes 22/06/2020 18:20:06             SALADITAS (GAMESA)
## 3558         MX001 Abarrotes 22/06/2020 18:21:09                      COCA COLA
## 3559         MX001 Abarrotes 26/06/2020 18:20:29                          BIMBO
## 3560         MX001 Abarrotes 22/06/2020 18:22:05                      DEL MONTE
## 3561         MX001 Abarrotes 26/06/2020 18:21:00                            FUD
## 3562         MX001 Abarrotes 26/06/2020 18:21:00                          BIMBO
## 3563         MX001 Abarrotes 22/06/2020 18:23:43                          FANTA
## 3564         MX001 Abarrotes 27/06/2020 00:09:40                           SABA
## 3565         MX001 Abarrotes 27/06/2020 00:10:11                           LALA
## 3566         MX001 Abarrotes 27/06/2020 00:11:42                    SPEED STICK
## 3567         MX001 Abarrotes 27/06/2020 00:12:10                           LALA
## 3568         MX001 Abarrotes 22/06/2020 18:25:41                          BIMBO
## 3569         MX001 Abarrotes 22/06/2020 18:25:41                    NUTRI LECHE
## 3570         MX001 Abarrotes 22/06/2020 18:26:38                      COCA COLA
## 3571         MX001 Abarrotes 27/06/2020 00:13:13                         DANONE
## 3572         MX001 Abarrotes 27/06/2020 00:21:00                          PEPSI
## 3573         MX001 Abarrotes 27/06/2020 00:21:00                    NUTRI LECHE
## 3574         MX001 Abarrotes 22/06/2020 18:30:36                       SEVEN UP
## 3575         MX001 Abarrotes 22/06/2020 18:31:38                       MARLBORO
## 3576         MX001 Abarrotes 27/06/2020 00:22:51                       MARINELA
## 3577         MX001 Abarrotes 22/06/2020 18:31:38                      COCA COLA
## 3578         MX001 Abarrotes 27/06/2020 00:25:05                          JUMEX
## 3579         MX001 Abarrotes 27/06/2020 00:25:05                         CHOKIS
## 3580         MX001 Abarrotes 22/06/2020 18:33:29                       FABULOSO
## 3581         MX001 Abarrotes 22/06/2020 18:33:29                          SALVO
## 3582         MX001 Abarrotes 27/06/2020 00:25:58                          BIMBO
## 3583         MX001 Abarrotes 27/06/2020 00:25:58                         SQUIRT
## 3584         MX001 Abarrotes 27/06/2020 00:26:43                         GAMESA
## 3585         MX001 Abarrotes 27/06/2020 00:26:43                     VALLE FRUT
## 3586         MX001 Abarrotes 27/06/2020 00:28:53                          EPURA
## 3587         MX001 Abarrotes 27/06/2020 00:30:21                        MASSISO
## 3588         MX001 Abarrotes 22/06/2020 18:37:24                         FRUTSI
## 3589         MX001 Abarrotes 27/06/2020 00:30:21                           LALA
## 3590         MX001 Abarrotes 27/06/2020 00:30:21                     VALLE FRUT
## 3591         MX001 Abarrotes 27/06/2020 00:30:44                       MARINELA
## 3592         MX001 Abarrotes 27/06/2020 00:30:44                       PAKETAXO
## 3593         MX001 Abarrotes 22/06/2020 18:39:37                      COCA COLA
## 3594         MX001 Abarrotes 22/06/2020 18:39:37                           LINK
## 3595         MX001 Abarrotes 22/06/2020 18:40:03             SALADITAS (GAMESA)
## 3596         MX001 Abarrotes 27/06/2020 00:32:23                     VALLE FRUT
## 3597         MX001 Abarrotes 22/06/2020 18:41:19                       MARUCHAN
## 3598         MX001 Abarrotes 22/06/2020 18:41:19                      DEL VALLE
## 3599         MX001 Abarrotes 27/06/2020 00:36:26                       TOSTITOS
## 3600         MX001 Abarrotes 27/06/2020 00:36:26                          BIMBO
## 3601         MX001 Abarrotes 22/06/2020 18:48:24                      COCA COLA
## 3602         MX001 Abarrotes 27/06/2020 00:36:26                         SPRITE
## 3603         MX001 Abarrotes 27/06/2020 00:38:26                      PALL MALL
## 3604         MX001 Abarrotes 22/06/2020 18:48:57                      COCA COLA
## 3605         MX001 Abarrotes 22/06/2020 18:49:14                    PEPSI LIGHT
## 3606         MX001 Abarrotes 27/06/2020 00:38:56                          BIMBO
## 3607         MX001 Abarrotes 22/06/2020 18:50:49                     CHURRUMAIS
## 3608         MX001 Abarrotes 27/06/2020 00:39:31                       MARLBORO
## 3609         MX001 Abarrotes 27/06/2020 08:55:58                        DORITOS
## 3610         MX001 Abarrotes 27/06/2020 08:55:58                           LALA
## 3611         MX001 Abarrotes 22/06/2020 18:51:07                      CONVERMEX
## 3612         MX001 Abarrotes 22/06/2020 18:52:02                      COCA COLA
## 3613         MX001 Abarrotes 22/06/2020 18:53:11                     TOPO CHICO
## 3614         MX001 Abarrotes 22/06/2020 18:53:11                      COCA COLA
## 3615         MX001 Abarrotes 27/06/2020 09:19:32                          BIMBO
## 3616         MX001 Abarrotes 22/06/2020 18:53:53                        BOKADOS
## 3617         MX001 Abarrotes 22/06/2020 18:53:53                       CLORALEX
## 3618         MX001 Abarrotes 22/06/2020 18:53:53                          PINOL
## 3619         MX001 Abarrotes 22/06/2020 18:53:53                        BOKADOS
## 3620         MX001 Abarrotes 27/06/2020 09:40:32                          BIMBO
## 3621         MX001 Abarrotes 27/06/2020 09:43:21                          BIMBO
## 3622         MX001 Abarrotes 22/06/2020 18:55:15                        ISADORA
## 3623         MX001 Abarrotes 22/06/2020 18:55:15                       JARRITOS
## 3624         MX001 Abarrotes 27/06/2020 09:58:44                     HELLMANN´S
## 3625         MX001 Abarrotes 22/06/2020 19:01:14                      LA SIERRA
## 3626         MX001 Abarrotes 27/06/2020 10:00:09                           TANG
## 3627         MX001 Abarrotes 27/06/2020 10:00:09                       FRUTIMAX
## 3628         MX001 Abarrotes 27/06/2020 10:01:49                        ENCANTO
## 3629         MX001 Abarrotes 27/06/2020 10:01:49                        DORITOS
## 3630         MX001 Abarrotes 27/06/2020 10:01:49                    RANCHERITOS
## 3631         MX001 Abarrotes 22/06/2020 19:01:52                         FRESCA
## 3632         MX001 Abarrotes 22/06/2020 19:11:00                      NORTEÑITA
## 3633         MX001 Abarrotes 27/06/2020 10:19:42                           LALA
## 3634         MX001 Abarrotes 22/06/2020 19:12:51                          PEPSI
## 3635         MX001 Abarrotes 22/06/2020 19:12:51                      CONVERMEX
## 3636         MX001 Abarrotes 27/06/2020 11:41:41                     LA VILLITA
## 3637         MX001 Abarrotes 22/06/2020 19:13:53                        KINDER 
## 3638         MX001 Abarrotes 22/06/2020 19:14:14                       TOSTILEO
## 3639         MX001 Abarrotes 27/06/2020 11:42:35                       MARUCHAN
## 3640         MX001 Abarrotes 27/06/2020 11:42:35                       MARINELA
## 3641         MX001 Abarrotes 27/06/2020 11:42:35                       MARINELA
## 3642         MX001 Abarrotes 27/06/2020 11:42:35                        DORITOS
## 3643         MX001 Abarrotes 22/06/2020 19:14:14                          PEPSI
## 3644         MX001 Abarrotes 27/06/2020 11:42:35                      COCA COLA
## 3645         MX001 Abarrotes 22/06/2020 19:14:14                      CONCHITAS
## 3646         MX001 Abarrotes 27/06/2020 11:42:35                       MARUCHAN
## 3647         MX001 Abarrotes 22/06/2020 19:14:48                      COCA COLA
## 3648         MX001 Abarrotes 27/06/2020 11:42:57                           LALA
## 3649         MX001 Abarrotes 22/06/2020 19:15:07                        KINDER 
## 3650         MX001 Abarrotes 22/06/2020 19:15:26                          PEPSI
## 3651         MX001 Abarrotes 27/06/2020 11:44:14                          PEPSI
## 3652         MX001 Abarrotes 27/06/2020 11:44:30                          PEPSI
## 3653         MX001 Abarrotes 22/06/2020 19:17:04                      COCA COLA
## 3654         MX001 Abarrotes 27/06/2020 11:53:53                  NESCAFE DECAF
## 3655         MX001 Abarrotes 27/06/2020 11:55:16                          PEPSI
## 3656         MX001 Abarrotes 22/06/2020 19:17:34                      COCA COLA
## 3657         MX001 Abarrotes 27/06/2020 11:55:16                      CONSOMATE
## 3658         MX001 Abarrotes 27/06/2020 11:55:16                       DIAMANTE
## 3659         MX001 Abarrotes 22/06/2020 19:18:09                VELADORA MEXICO
## 3660         MX001 Abarrotes 22/06/2020 19:20:44                          PEPSI
## 3661         MX001 Abarrotes 27/06/2020 11:59:04                          PEPSI
## 3662         MX001 Abarrotes 22/06/2020 19:22:06                          SALVO
## 3663         MX001 Abarrotes 22/06/2020 19:22:36                      COCA COLA
## 3664         MX001 Abarrotes 27/06/2020 12:00:47                      COCA COLA
## 3665         MX001 Abarrotes 22/06/2020 19:25:43                    NUTRI LECHE
## 3666         MX001 Abarrotes 22/06/2020 19:25:43     BLANCA NIEVES (DETERGENTE)
## 3667         MX001 Abarrotes 22/06/2020 19:25:43                        DORITOS
## 3668         MX001 Abarrotes 22/06/2020 19:25:43                       MARUCHAN
## 3669         MX001 Abarrotes 27/06/2020 12:04:32                       POWERADE
## 3670         MX001 Abarrotes 22/06/2020 19:27:10                        RUFFLES
## 3671         MX001 Abarrotes 27/06/2020 12:08:02                          PEPSI
## 3672         MX001 Abarrotes 22/06/2020 19:32:37                           EPIX
## 3673         MX001 Abarrotes 22/06/2020 19:33:35                           ZUKO
## 3674         MX001 Abarrotes 22/06/2020 19:33:35                           ZUKO
## 3675         MX001 Abarrotes 27/06/2020 12:12:52                    5 ESTRELLAS
## 3676         MX001 Abarrotes 27/06/2020 12:14:21                          SALVO
## 3677         MX001 Abarrotes 27/06/2020 12:14:21                      COCA COLA
## 3678         MX001 Abarrotes 22/06/2020 19:34:21                COCA COLA LIGHT
## 3679         MX001 Abarrotes 27/06/2020 12:14:21                         NORVER
## 3680         MX001 Abarrotes 27/06/2020 12:14:21                           INCA
## 3681         MX001 Abarrotes 22/06/2020 19:34:21                      COCA COLA
## 3682         MX001 Abarrotes 27/06/2020 12:14:21                      CONSOMATE
## 3683         MX001 Abarrotes 27/06/2020 12:17:36                     HELLMANN´S
## 3684         MX001 Abarrotes 22/06/2020 19:35:07                           ZOTE
## 3685         MX001 Abarrotes 27/06/2020 12:17:36                     LA VILLITA
## 3686         MX001 Abarrotes 27/06/2020 12:18:04                           LALA
## 3687         MX001 Abarrotes 22/06/2020 19:37:41                     DOÑA MARIA
## 3688         MX001 Abarrotes 22/06/2020 19:37:41                           FOCA
## 3689         MX001 Abarrotes 22/06/2020 19:37:41                       SUAVITEL
## 3690         MX001 Abarrotes 22/06/2020 19:45:24                           BIDA
## 3691         MX001 Abarrotes 22/06/2020 19:45:24                      COCA COLA
## 3692         MX001 Abarrotes 27/06/2020 12:30:40                          PEPSI
## 3693         MX001 Abarrotes 22/06/2020 19:46:00                           LALA
## 3694         MX001 Abarrotes 22/06/2020 19:46:19                      COCA COLA
## 3695         MX001 Abarrotes 22/06/2020 19:47:35                        KINDER 
## 3696         MX001 Abarrotes 22/06/2020 19:49:30                          PEPSI
## 3697         MX001 Abarrotes 22/06/2020 19:50:43                          JUMEX
## 3698         MX001 Abarrotes 27/06/2020 12:39:20                          PEPSI
## 3699         MX001 Abarrotes 27/06/2020 12:41:19                          PEPSI
## 3700         MX001 Abarrotes 22/06/2020 19:54:25                      COCA COLA
## 3701         MX001 Abarrotes 22/06/2020 19:55:12                     TOPO CHICO
## 3702         MX001 Abarrotes 27/06/2020 12:41:37                       SEVEN UP
## 3703         MX001 Abarrotes 22/06/2020 19:55:12                      COCA COLA
## 3704         MX001 Abarrotes 27/06/2020 12:54:16                        ISADORA
## 3705         MX001 Abarrotes 27/06/2020 12:56:01                          PEPSI
## 3706         MX001 Abarrotes 22/06/2020 19:56:39                          LUCAS
## 3707         MX001 Abarrotes 27/06/2020 13:14:15                       TOSTITOS
## 3708         MX001 Abarrotes 22/06/2020 19:57:09                          PEPSI
## 3709         MX001 Abarrotes 27/06/2020 13:20:17                      COCA COLA
## 3710         MX001 Abarrotes 22/06/2020 19:57:09                           TANG
## 3711         MX001 Abarrotes 27/06/2020 13:20:17                       FABULOSO
## 3712         MX001 Abarrotes 22/06/2020 19:57:35                      COCA COLA
## 3713         MX001 Abarrotes 27/06/2020 13:30:14                           JOYA
## 3714         MX001 Abarrotes 22/06/2020 19:59:06                     DEL FUERTE
## 3715         MX001 Abarrotes 27/06/2020 13:35:14                      COCA COLA
## 3716         MX001 Abarrotes 27/06/2020 13:35:14                      DEL HOGAR
## 3717         MX001 Abarrotes 27/06/2020 13:37:55                         ENRE-2
## 3718         MX001 Abarrotes 27/06/2020 13:37:55                        KINDER 
## 3719         MX001 Abarrotes 22/06/2020 20:00:44                          PEPSI
## 3720         MX001 Abarrotes 22/06/2020 20:00:54                 COCA COLA ZERO
## 3721         MX001 Abarrotes 22/06/2020 20:01:22                       MARLBORO
## 3722         MX001 Abarrotes 22/06/2020 20:01:22                       MARINELA
## 3723         MX001 Abarrotes 22/06/2020 20:01:22                        BOKADOS
## 3724         MX001 Abarrotes 27/06/2020 14:09:41                     TOPO CHICO
## 3725         MX001 Abarrotes 22/06/2020 20:04:27                         ENRE-2
## 3726         MX001 Abarrotes 22/06/2020 20:04:27                          BIMBO
## 3727         MX001 Abarrotes 22/06/2020 20:05:33                COCA COLA LIGHT
## 3728         MX001 Abarrotes 27/06/2020 14:41:05                          BIMBO
## 3729         MX001 Abarrotes 22/06/2020 20:06:03                      COCA COLA
## 3730         MX001 Abarrotes 27/06/2020 14:41:05                     BLUE HOUSE
## 3731         MX001 Abarrotes 27/06/2020 14:41:05                       KARTAMUS
## 3732         MX001 Abarrotes 27/06/2020 15:05:44                       PAKETAXO
## 3733         MX001 Abarrotes 27/06/2020 15:05:44                       PAKETAXO
## 3734         MX001 Abarrotes 27/06/2020 15:05:44                  MANZANITA SOL
## 3735         MX001 Abarrotes 22/06/2020 20:07:33                       POWERADE
## 3736         MX001 Abarrotes 22/06/2020 20:07:33                           JOYA
## 3737         MX001 Abarrotes 27/06/2020 15:05:44                       MARINELA
## 3738         MX001 Abarrotes 27/06/2020 15:06:34                       MARLBORO
## 3739         MX001 Abarrotes 22/06/2020 20:07:54                          PEPSI
## 3740         MX001 Abarrotes 27/06/2020 15:06:34                          EPURA
## 3741         MX001 Abarrotes 27/06/2020 15:09:14                       POWERADE
## 3742         MX001 Abarrotes 27/06/2020 15:09:14                       POWERADE
## 3743         MX001 Abarrotes 27/06/2020 15:09:43                       MARLBORO
## 3744         MX001 Abarrotes 27/06/2020 15:11:06                          JUMEX
## 3745         MX001 Abarrotes 27/06/2020 15:11:06                       MARUCHAN
## 3746         MX001 Abarrotes 27/06/2020 15:11:06                          PEPSI
## 3747         MX001 Abarrotes 27/06/2020 15:12:14                          BIMBO
## 3748         MX001 Abarrotes 27/06/2020 15:12:14                     VIVE 100 %
## 3749         MX001 Abarrotes 27/06/2020 15:12:14                      COCA COLA
## 3750         MX001 Abarrotes 27/06/2020 15:12:27                          PEPSI
## 3751         MX001 Abarrotes 22/06/2020 20:12:11               HEAD & SHOULDERS
## 3752         MX001 Abarrotes 22/06/2020 20:12:55                        DORITOS
## 3753         MX001 Abarrotes 22/06/2020 20:13:21                         FRUTSI
## 3754         MX001 Abarrotes 22/06/2020 20:13:54                          PEPSI
## 3755         MX001 Abarrotes 22/06/2020 20:14:19                        RUFFLES
## 3756         MX001 Abarrotes 27/06/2020 15:17:26                     HELLMANN´S
## 3757         MX001 Abarrotes 22/06/2020 20:14:31                       PAKETAXO
## 3758         MX001 Abarrotes 27/06/2020 15:17:46                          PEPSI
## 3759         MX001 Abarrotes 27/06/2020 15:18:14                          PEPSI
## 3760         MX001 Abarrotes 22/06/2020 20:14:57                          PEPSI
## 3761         MX001 Abarrotes 27/06/2020 15:22:24                       SABRITAS
## 3762         MX001 Abarrotes 27/06/2020 15:22:24                        CHEETOS
## 3763         MX001 Abarrotes 22/06/2020 20:15:40                     LA COSTEÑA
## 3764         MX001 Abarrotes 27/06/2020 15:22:24                          PEPSI
## 3765         MX001 Abarrotes 27/06/2020 15:22:24                      CONVERMEX
## 3766         MX001 Abarrotes 22/06/2020 20:16:01                        KINDER 
## 3767         MX001 Abarrotes 22/06/2020 20:17:12                      COCA COLA
## 3768         MX001 Abarrotes 22/06/2020 20:17:36                      COCA COLA
## 3769         MX001 Abarrotes 27/06/2020 16:32:05                      COCA COLA
## 3770         MX001 Abarrotes 27/06/2020 16:33:32                          PEPSI
## 3771         MX001 Abarrotes 22/06/2020 20:18:09                        TIX TIX
## 3772         MX001 Abarrotes 27/06/2020 16:33:57                       SABRITAS
## 3773         MX001 Abarrotes 27/06/2020 16:36:34                     BLUE HOUSE
## 3774         MX001 Abarrotes 22/06/2020 20:20:57                      PANASONIC
## 3775         MX001 Abarrotes 27/06/2020 16:36:59                          JUMEX
## 3776         MX001 Abarrotes 27/06/2020 16:36:59                       MARINELA
## 3777         MX001 Abarrotes 22/06/2020 20:23:34                          PEPSI
## 3778         MX001 Abarrotes 27/06/2020 16:37:19                      PALL MALL
## 3779         MX001 Abarrotes 22/06/2020 20:26:42                          PEPSI
## 3780         MX001 Abarrotes 22/06/2020 20:26:42                          PEPSI
## 3781         MX001 Abarrotes 22/06/2020 20:28:09                        RUFFLES
## 3782         MX001 Abarrotes 27/06/2020 16:46:49                          PEPSI
## 3783         MX001 Abarrotes 22/06/2020 20:28:25                        RUFFLES
## 3784         MX001 Abarrotes 27/06/2020 16:49:46                     LA VILLITA
## 3785         MX001 Abarrotes 22/06/2020 20:28:59                     TOPO CHICO
## 3786         MX001 Abarrotes 27/06/2020 16:57:15                          MAMUT
## 3787         MX001 Abarrotes 27/06/2020 16:57:15                        TRIDENT
## 3788         MX001 Abarrotes 22/06/2020 20:29:38                         VIRMAR
## 3789         MX001 Abarrotes 22/06/2020 20:29:38                EL GALLO DE ORO
## 3790         MX001 Abarrotes 22/06/2020 20:29:38                      PALL MALL
## 3791         MX001 Abarrotes 22/06/2020 20:29:38                        CAMELIA
## 3792         MX001 Abarrotes 22/06/2020 20:30:17                          GOLOS
## 3793         MX001 Abarrotes 22/06/2020 20:30:17                        CHEETOS
## 3794         MX001 Abarrotes 22/06/2020 20:30:17                    PAPIRRINGAS
## 3795         MX001 Abarrotes 27/06/2020 16:59:53                      DEL VALLE
## 3796         MX001 Abarrotes 22/06/2020 20:34:29                            FUD
## 3797         MX001 Abarrotes 22/06/2020 20:34:29                         CHIMEX
## 3798         MX001 Abarrotes 22/06/2020 20:34:29                        YOPLAIT
## 3799         MX001 Abarrotes 27/06/2020 16:59:53                      COCA COLA
## 3800         MX001 Abarrotes 27/06/2020 17:01:23                           TANG
## 3801         MX001 Abarrotes 22/06/2020 20:34:49                  MANZANITA SOL
## 3802         MX001 Abarrotes 27/06/2020 17:05:28                       TOSTILEO
## 3803         MX001 Abarrotes 27/06/2020 17:05:28                        BOKADOS
## 3804         MX001 Abarrotes 22/06/2020 20:36:24                    5 ESTRELLAS
## 3805         MX001 Abarrotes 27/06/2020 17:05:28                 COCA COLA ZERO
## 3806         MX001 Abarrotes 27/06/2020 17:09:52                          BIMBO
## 3807         MX001 Abarrotes 22/06/2020 20:37:49                         FRUTSI
## 3808         MX001 Abarrotes 27/06/2020 17:10:26                          JUMEX
## 3809         MX001 Abarrotes 22/06/2020 20:37:49                           TANG
## 3810         MX001 Abarrotes 22/06/2020 20:38:21                          LUCAS
## 3811         MX001 Abarrotes 22/06/2020 20:38:44                        RUFFLES
## 3812         MX001 Abarrotes 22/06/2020 20:38:44                         DANONE
## 3813         MX001 Abarrotes 22/06/2020 20:43:00                       POWERADE
## 3814         MX001 Abarrotes 27/06/2020 17:58:50                       MARLBORO
## 3815         MX001 Abarrotes 27/06/2020 18:10:08                          BIMBO
## 3816         MX001 Abarrotes 22/06/2020 20:45:50                  CHOCO KRISPIS
## 3817         MX001 Abarrotes 27/06/2020 18:27:54             SALADITAS (GAMESA)
## 3818         MX001 Abarrotes 22/06/2020 20:48:42                      COCA COLA
## 3819         MX001 Abarrotes 22/06/2020 20:48:42                       POWERADE
## 3820         MX001 Abarrotes 22/06/2020 20:51:25                        BOKADOS
## 3821         MX001 Abarrotes 22/06/2020 20:51:25                       PAKETAXO
## 3822         MX001 Abarrotes 22/06/2020 20:51:25                    LA BOTANERA
## 3823         MX001 Abarrotes 27/06/2020 18:35:20                          PEPSI
## 3824         MX001 Abarrotes 22/06/2020 20:51:25                         SQUIRT
## 3825         MX001 Abarrotes 27/06/2020 18:40:21                          PEPSI
## 3826         MX001 Abarrotes 22/06/2020 20:51:52                         FRESCA
## 3827         MX001 Abarrotes 22/06/2020 20:52:54                          PEPSI
## 3828         MX001 Abarrotes 27/06/2020 18:42:15                       PRINGLES
## 3829         MX001 Abarrotes 22/06/2020 20:53:56                        KINDER 
## 3830         MX001 Abarrotes 27/06/2020 18:43:20                      PANASONIC
## 3831         MX001 Abarrotes 22/06/2020 20:54:59                         FRESCA
## 3832         MX001 Abarrotes 22/06/2020 20:55:19                          PEPSI
## 3833         MX001 Abarrotes 27/06/2020 18:43:43                        KINDER 
## 3834         MX001 Abarrotes 22/06/2020 20:59:00                          PEPSI
## 3835         MX001 Abarrotes 22/06/2020 20:59:43                     VIVE 100 %
## 3836         MX001 Abarrotes 27/06/2020 18:48:09                           GIRO
## 3837         MX001 Abarrotes 27/06/2020 18:48:09                          MAMUT
## 3838         MX001 Abarrotes 27/06/2020 18:52:04                      COCA COLA
## 3839         MX001 Abarrotes 27/06/2020 18:52:04                          EPURA
## 3840         MX001 Abarrotes 27/06/2020 18:53:00                       PAKETAXO
## 3841         MX001 Abarrotes 22/06/2020 21:04:14                          BIMBO
## 3842         MX001 Abarrotes 22/06/2020 21:04:14                        CHEETOS
## 3843         MX001 Abarrotes 27/06/2020 18:53:59                     VALLE FRUT
## 3844         MX001 Abarrotes 22/06/2020 21:05:15                      COCA COLA
## 3845         MX001 Abarrotes 27/06/2020 18:54:19                        RUFFLES
## 3846         MX001 Abarrotes 27/06/2020 18:54:19                      DEL VALLE
## 3847         MX001 Abarrotes 22/06/2020 21:07:39                         CHOKIS
## 3848         MX001 Abarrotes 22/06/2020 21:07:39                         GAMESA
## 3849         MX001 Abarrotes 22/06/2020 21:07:39                          BIMBO
## 3850         MX001 Abarrotes 22/06/2020 21:07:39                          JUMEX
## 3851         MX001 Abarrotes 22/06/2020 21:07:39                        CAMELIA
## 3852         MX001 Abarrotes 22/06/2020 21:08:00                          PEPSI
## 3853         MX001 Abarrotes 22/06/2020 21:10:32                          BIMBO
## 3854         MX001 Abarrotes 27/06/2020 18:55:45                       CLORALEX
## 3855         MX001 Abarrotes 22/06/2020 21:10:32                          PEPSI
## 3856         MX001 Abarrotes 27/06/2020 18:55:45                    DE LA VIUDA
## 3857         MX001 Abarrotes 27/06/2020 18:56:28                        DORITOS
## 3858         MX001 Abarrotes 22/06/2020 21:12:47                          JUMEX
## 3859         MX001 Abarrotes 27/06/2020 18:57:48                           TANG
## 3860         MX001 Abarrotes 22/06/2020 21:13:26                        DORITOS
## 3861         MX001 Abarrotes 27/06/2020 19:04:19                       GILLETTE
## 3862         MX001 Abarrotes 27/06/2020 19:04:19                          HALLS
## 3863         MX001 Abarrotes 22/06/2020 21:16:36                          BIMBO
## 3864         MX001 Abarrotes 22/06/2020 21:17:07                         CHIMEX
## 3865         MX001 Abarrotes 27/06/2020 19:06:40                      COCA COLA
## 3866         MX001 Abarrotes 27/06/2020 19:09:54                           LALA
## 3867         MX001 Abarrotes 27/06/2020 19:09:54                  NESCAFE DECAF
## 3868         MX001 Abarrotes 22/06/2020 21:17:46                       MARLBORO
## 3869         MX001 Abarrotes 27/06/2020 19:12:57                     LA COSTEÑA
## 3870         MX001 Abarrotes 27/06/2020 19:12:57                        CLAMATO
## 3871         MX001 Abarrotes 27/06/2020 19:14:27                      CONVERMEX
## 3872         MX001 Abarrotes 27/06/2020 19:14:27                      CONVERMEX
## 3873         MX001 Abarrotes 22/06/2020 21:20:01                       SEVEN UP
## 3874         MX001 Abarrotes 22/06/2020 21:23:28     BLANCA NIEVES (DETERGENTE)
## 3875         MX001 Abarrotes 27/06/2020 19:20:17                          PEPSI
## 3876         MX001 Abarrotes 27/06/2020 19:21:19                         GERBER
## 3877         MX001 Abarrotes 27/06/2020 19:23:40                       MARLBORO
## 3878         MX001 Abarrotes 22/06/2020 21:27:46                           GIRO
## 3879         MX001 Abarrotes 27/06/2020 19:23:40                          BIMBO
## 3880         MX001 Abarrotes 22/06/2020 21:27:46                           LALA
## 3881         MX001 Abarrotes 27/06/2020 19:23:40                       KARTAMUS
## 3882         MX001 Abarrotes 22/06/2020 21:27:46                       POWERADE
## 3883         MX001 Abarrotes 27/06/2020 19:27:56                      PANASONIC
## 3884         MX001 Abarrotes 22/06/2020 21:28:11                        RUFFLES
## 3885         MX001 Abarrotes 22/06/2020 21:28:11                        CHEETOS
## 3886         MX001 Abarrotes 27/06/2020 19:27:56                        DORITOS
## 3887         MX001 Abarrotes 27/06/2020 19:29:56                       SABRITAS
## 3888         MX001 Abarrotes 22/06/2020 21:28:37                     CAMPBELL'S
## 3889         MX001 Abarrotes 22/06/2020 21:28:37                           LINK
## 3890         MX001 Abarrotes 27/06/2020 19:32:40                          KRAFT
## 3891         MX001 Abarrotes 22/06/2020 21:31:02                           LALA
## 3892         MX001 Abarrotes 22/06/2020 21:31:02                COCA COLA LIGHT
## 3893         MX001 Abarrotes 22/06/2020 21:31:02                      COCA COLA
## 3894         MX001 Abarrotes 22/06/2020 21:33:02                      COCA COLA
## 3895         MX001 Abarrotes 27/06/2020 19:34:23                       DANONINO
## 3896         MX001 Abarrotes 22/06/2020 21:35:21                          PEPSI
## 3897         MX001 Abarrotes 22/06/2020 21:39:00                           ZOTE
## 3898         MX001 Abarrotes 22/06/2020 21:39:00                      COCA COLA
## 3899         MX001 Abarrotes 27/06/2020 19:34:58                           JOYA
## 3900         MX001 Abarrotes 27/06/2020 19:39:23                          BIMBO
## 3901         MX001 Abarrotes 27/06/2020 19:43:36                          PEPSI
## 3902         MX001 Abarrotes 22/06/2020 21:43:30                        BOKADOS
## 3903         MX001 Abarrotes 27/06/2020 19:44:31                      COCA COLA
## 3904         MX001 Abarrotes 27/06/2020 19:45:16                      COCA COLA
## 3905         MX001 Abarrotes 22/06/2020 21:45:19                           LALA
## 3906         MX001 Abarrotes 27/06/2020 19:46:52                          HALLS
## 3907         MX001 Abarrotes 22/06/2020 21:45:19                      COCA COLA
## 3908         MX001 Abarrotes 27/06/2020 19:48:43                         ACT II
## 3909         MX001 Abarrotes 27/06/2020 19:48:43             SALADITAS (GAMESA)
## 3910         MX001 Abarrotes 27/06/2020 19:48:43                          PEPSI
## 3911         MX001 Abarrotes 22/06/2020 21:45:58                          FANTA
## 3912         MX001 Abarrotes 22/06/2020 21:46:39                       BONAFONT
## 3913         MX001 Abarrotes 22/06/2020 21:48:08                       MARINELA
## 3914         MX001 Abarrotes 22/06/2020 21:48:08                           LALA
## 3915         MX001 Abarrotes 22/06/2020 21:48:08                          PEPSI
## 3916         MX001 Abarrotes 27/06/2020 19:51:58                        SELECTA
## 3917         MX001 Abarrotes 27/06/2020 19:55:50                BENSON & HEDGES
## 3918         MX001 Abarrotes 22/06/2020 21:49:46                       CLORALEX
## 3919         MX001 Abarrotes 22/06/2020 21:49:46                       SABRITAS
## 3920         MX001 Abarrotes 27/06/2020 20:02:33                        NORTEÑO
## 3921         MX001 Abarrotes 27/06/2020 20:02:33                       PEÑAFIEL
## 3922         MX001 Abarrotes 22/06/2020 21:56:38                    RANCH STYLE
## 3923         MX001 Abarrotes 22/06/2020 21:56:38                      COCA COLA
## 3924         MX001 Abarrotes 27/06/2020 20:06:55                      COCA COLA
## 3925         MX001 Abarrotes 27/06/2020 20:07:34                     VALLE FRUT
## 3926         MX001 Abarrotes 22/06/2020 21:57:53                        CHEETOS
## 3927         MX001 Abarrotes 22/06/2020 21:58:17                        BOKADOS
## 3928         MX001 Abarrotes 22/06/2020 21:59:06                         RUEDAS
## 3929         MX001 Abarrotes 27/06/2020 20:11:37                       MARINELA
## 3930         MX001 Abarrotes 22/06/2020 22:01:44                          PEPSI
## 3931         MX001 Abarrotes 22/06/2020 22:02:13                          PEPSI
## 3932         MX001 Abarrotes 27/06/2020 20:13:29                           LINK
## 3933         MX001 Abarrotes 27/06/2020 20:15:17                           LALA
## 3934         MX001 Abarrotes 22/06/2020 22:03:42                           JOYA
## 3935         MX001 Abarrotes 22/06/2020 22:06:14                            FUD
## 3936         MX001 Abarrotes 22/06/2020 22:06:14                          BIMBO
## 3937         MX001 Abarrotes 22/06/2020 22:06:14                          BIMBO
## 3938         MX001 Abarrotes 22/06/2020 22:06:14                     LA VILLITA
## 3939         MX001 Abarrotes 22/06/2020 22:06:14                      COCA COLA
## 3940         MX001 Abarrotes 27/06/2020 20:21:10                          BIMBO
## 3941         MX001 Abarrotes 27/06/2020 20:21:44             CROSEE & BLACKWELL
## 3942         MX001 Abarrotes 22/06/2020 22:07:42                        KINDER 
## 3943         MX001 Abarrotes 22/06/2020 22:08:12                BENSON & HEDGES
## 3944         MX001 Abarrotes 27/06/2020 20:24:34                       PAKETAXO
## 3945         MX001 Abarrotes 22/06/2020 22:08:28                        CHEETOS
## 3946         MX001 Abarrotes 27/06/2020 20:24:34                       SABRITAS
## 3947         MX001 Abarrotes 27/06/2020 20:24:58                       PAKETAXO
## 3948         MX001 Abarrotes 27/06/2020 20:25:23                      COCA COLA
## 3949         MX001 Abarrotes 22/06/2020 22:15:54                        NESCAFE
## 3950         MX001 Abarrotes 27/06/2020 20:30:06                       SABRITAS
## 3951         MX001 Abarrotes 22/06/2020 22:17:07                           LINK
## 3952         MX001 Abarrotes 27/06/2020 20:35:25                         FRITOS
## 3953         MX001 Abarrotes 27/06/2020 20:35:25                          PEPSI
## 3954         MX001 Abarrotes 22/06/2020 22:17:56                       JARRITOS
## 3955         MX001 Abarrotes 22/06/2020 22:21:08                       MARLBORO
## 3956         MX001 Abarrotes 22/06/2020 22:21:08                       TOSTITOS
## 3957         MX001 Abarrotes 22/06/2020 22:21:08                          PEPSI
## 3958         MX001 Abarrotes 28/06/2020 00:56:40                        DORITOS
## 3959         MX001 Abarrotes 22/06/2020 22:22:42                          BIMBO
## 3960         MX001 Abarrotes 28/06/2020 00:56:40                           JOYA
## 3961         MX001 Abarrotes 28/06/2020 00:57:08                          BIMBO
## 3962         MX001 Abarrotes 28/06/2020 00:57:21                          PEPSI
## 3963         MX001 Abarrotes 22/06/2020 22:27:16                       POWERADE
## 3964         MX001 Abarrotes 22/06/2020 22:27:16                         BOGO´S
## 3965         MX001 Abarrotes 28/06/2020 00:58:00                          PEPSI
## 3966         MX001 Abarrotes 22/06/2020 22:28:01                           LINK
## 3967         MX001 Abarrotes 22/06/2020 22:29:18                           LALA
## 3968         MX001 Abarrotes 28/06/2020 00:59:46                       MARLBORO
## 3969         MX001 Abarrotes 22/06/2020 22:29:52                        RUFFLES
## 3970         MX001 Abarrotes 22/06/2020 22:29:52                          PEPSI
## 3971         MX001 Abarrotes 22/06/2020 22:29:52                COCA COLA LIGHT
## 3972         MX001 Abarrotes 22/06/2020 22:30:28                          PEPSI
## 3973         MX001 Abarrotes 28/06/2020 01:03:29                  MANZANITA SOL
## 3974         MX001 Abarrotes 28/06/2020 01:03:29                         SQUIRT
## 3975         MX001 Abarrotes 28/06/2020 08:25:29                        LA FINA
## 3976         MX001 Abarrotes 22/06/2020 22:36:21                       SEVEN UP
## 3977         MX001 Abarrotes 28/06/2020 09:14:34                      COCA COLA
## 3978         MX001 Abarrotes 28/06/2020 09:14:34                       KOLALOKA
## 3979         MX001 Abarrotes 22/06/2020 22:37:49                       COLGATE 
## 3980         MX001 Abarrotes 22/06/2020 22:52:09                       MARINELA
## 3981         MX001 Abarrotes 28/06/2020 09:22:21                       POWERADE
## 3982         MX001 Abarrotes 28/06/2020 09:22:21                          EPURA
## 3983         MX001 Abarrotes 22/06/2020 22:53:35                          BIMBO
## 3984         MX001 Abarrotes 28/06/2020 09:23:13                    5 ESTRELLAS
## 3985         MX001 Abarrotes 28/06/2020 09:25:40                           LALA
## 3986         MX001 Abarrotes 22/06/2020 22:54:07                      DEL VALLE
## 3987         MX001 Abarrotes 22/06/2020 22:54:58                            SOL
## 3988         MX001 Abarrotes 28/06/2020 09:36:15                      COCA COLA
## 3989         MX001 Abarrotes 22/06/2020 22:54:58                      PALL MALL
## 3990         MX001 Abarrotes 28/06/2020 09:36:15                          PEPSI
## 3991         MX001 Abarrotes 22/06/2020 22:55:56                          BIMBO
## 3992         MX001 Abarrotes 28/06/2020 09:45:49                           LALA
## 3993         MX001 Abarrotes 22/06/2020 22:55:56                          PEPSI
## 3994         MX001 Abarrotes 22/06/2020 22:56:16                       MARINELA
## 3995         MX001 Abarrotes 28/06/2020 09:48:35                      COCA COLA
## 3996         MX001 Abarrotes 22/06/2020 22:57:08                            SOL
## 3997         MX001 Abarrotes 22/06/2020 22:57:30                       GATORADE
## 3998         MX001 Abarrotes 22/06/2020 22:57:30                          BIMBO
## 3999         MX001 Abarrotes 22/06/2020 22:57:30                      COCA COLA
## 4000         MX001 Abarrotes 28/06/2020 10:14:06                         EFICAZ
## 4001         MX001 Abarrotes 28/06/2020 10:14:06                           ZEST
## 4002         MX001 Abarrotes 22/06/2020 22:59:11                     TOPO CHICO
## 4003         MX001 Abarrotes 28/06/2020 10:16:38                           LALA
## 4004         MX001 Abarrotes 22/06/2020 22:59:51                       SABRITAS
## 4005         MX001 Abarrotes 28/06/2020 10:16:38                           ZOTE
## 4006         MX001 Abarrotes 22/06/2020 23:02:04                          BOING
## 4007         MX001 Abarrotes 28/06/2020 10:16:59                COCA COLA LIGHT
## 4008         MX001 Abarrotes 22/06/2020 23:02:51                          PEPSI
## 4009         MX001 Abarrotes 28/06/2020 11:36:36                        KINDER 
## 4010         MX001 Abarrotes 28/06/2020 11:41:04                      COCA COLA
## 4011         MX001 Abarrotes 22/06/2020 23:03:07                           LALA
## 4012         MX001 Abarrotes 28/06/2020 11:41:45                          PEPSI
## 4013         MX001 Abarrotes 28/06/2020 11:41:45                        KINDER 
## 4014         MX001 Abarrotes 22/06/2020 23:05:09                       MARINELA
## 4015         MX001 Abarrotes 28/06/2020 11:43:55                 COCA COLA ZERO
## 4016         MX001 Abarrotes 28/06/2020 11:43:55                          BIMBO
## 4017         MX001 Abarrotes 28/06/2020 11:43:55                    ELECTROPURA
## 4018         MX001 Abarrotes 28/06/2020 11:43:55                      COCA COLA
## 4019         MX001 Abarrotes 28/06/2020 11:43:55                        KINDER 
## 4020         MX001 Abarrotes 28/06/2020 11:44:13                       TOSTITOS
## 4021         MX001 Abarrotes 22/06/2020 23:05:41                        CRISTAL
## 4022         MX001 Abarrotes 22/06/2020 23:06:02                       SABRITAS
## 4023         MX001 Abarrotes 28/06/2020 11:45:09                       MARINELA
## 4024         MX001 Abarrotes 22/06/2020 23:06:29                     BLUE HOUSE
## 4025         MX001 Abarrotes 22/06/2020 23:06:52                       MARINELA
## 4026         MX001 Abarrotes 28/06/2020 11:46:49                          PEPSI
## 4027         MX001 Abarrotes 28/06/2020 11:47:34                      NATURELLA
## 4028         MX001 Abarrotes 22/06/2020 23:07:20                        CHEETOS
## 4029         MX001 Abarrotes 28/06/2020 11:47:34                       MARINELA
## 4030         MX001 Abarrotes 28/06/2020 11:49:43                          PEPSI
## 4031         MX001 Abarrotes 28/06/2020 11:49:43                        ISADORA
## 4032         MX001 Abarrotes 22/06/2020 23:08:28                       TOSTITOS
## 4033         MX001 Abarrotes 28/06/2020 11:50:34                           GIRO
## 4034         MX001 Abarrotes 28/06/2020 11:50:46                          KRAFT
## 4035         MX001 Abarrotes 28/06/2020 11:50:46                      COCA COLA
## 4036         MX001 Abarrotes 22/06/2020 23:09:35                           JOYA
## 4037         MX001 Abarrotes 22/06/2020 23:10:37                            LEO
## 4038         MX001 Abarrotes 28/06/2020 11:51:16                  TOPITOS (BK2)
## 4039         MX001 Abarrotes 22/06/2020 23:10:37                          BIMBO
## 4040         MX001 Abarrotes 22/06/2020 23:10:37                          BIMBO
## 4041         MX001 Abarrotes 22/06/2020 23:10:37                       SABRITAS
## 4042         MX001 Abarrotes 22/06/2020 23:11:03                          PEPSI
## 4043         MX001 Abarrotes 22/06/2020 23:11:03                          EPURA
## 4044         MX001 Abarrotes 28/06/2020 11:53:19                       FUZE TEA
## 4045         MX001 Abarrotes 22/06/2020 23:11:27                          PEPSI
## 4046         MX001 Abarrotes 28/06/2020 11:54:15                    ELECTROPURA
## 4047         MX001 Abarrotes 22/06/2020 23:11:58                           LINK
## 4048         MX001 Abarrotes 22/06/2020 23:14:33                          PEPSI
## 4049         MX001 Abarrotes 22/06/2020 23:15:06                       MARINELA
## 4050         MX001 Abarrotes 22/06/2020 23:15:06                        YOPLAIT
## 4051         MX001 Abarrotes 22/06/2020 23:15:23                       POWERADE
## 4052         MX001 Abarrotes 22/06/2020 23:15:23                      DEL VALLE
## 4053         MX001 Abarrotes 28/06/2020 11:59:59                     VALLE FRUT
## 4054         MX001 Abarrotes 22/06/2020 23:16:06                          PEPSI
## 4055         MX001 Abarrotes 22/06/2020 23:16:30                      COCA COLA
## 4056         MX001 Abarrotes 28/06/2020 12:03:55                          BIMBO
## 4057         MX001 Abarrotes 28/06/2020 12:03:55                           JOYA
## 4058         MX001 Abarrotes 22/06/2020 23:17:19                           JOYA
## 4059         MX001 Abarrotes 22/06/2020 23:18:03                     LA COSTEÑA
## 4060         MX001 Abarrotes 28/06/2020 12:06:30                       MARINELA
## 4061         MX001 Abarrotes 28/06/2020 12:06:30                      COCA COLA
## 4062         MX001 Abarrotes 22/06/2020 23:19:02                VELADORA MEXICO
## 4063         MX001 Abarrotes 22/06/2020 23:19:02                          FLASH
## 4064         MX001 Abarrotes 22/06/2020 23:19:02                          PEPSI
## 4065         MX001 Abarrotes 22/06/2020 23:19:26                         GAMESA
## 4066         MX001 Abarrotes 28/06/2020 12:08:19                          PEPSI
## 4067         MX001 Abarrotes 28/06/2020 12:09:29                           LALA
## 4068         MX001 Abarrotes 28/06/2020 12:09:29                      COCA COLA
## 4069         MX001 Abarrotes 28/06/2020 12:09:29                          BIMBO
## 4070         MX001 Abarrotes 28/06/2020 12:09:29                          BIMBO
## 4071         MX001 Abarrotes 22/06/2020 23:21:56                     CHIP-OTLES
## 4072         MX001 Abarrotes 28/06/2020 12:09:46                          PEPSI
## 4073         MX001 Abarrotes 22/06/2020 23:22:43                       MARINELA
## 4074         MX001 Abarrotes 22/06/2020 23:22:43                       TOSTITOS
## 4075         MX001 Abarrotes 22/06/2020 23:22:43                          PEPSI
## 4076         MX001 Abarrotes 28/06/2020 12:10:34                       MARUCHAN
## 4077         MX001 Abarrotes 28/06/2020 12:10:34                          BIMBO
## 4078         MX001 Abarrotes 28/06/2020 12:10:34                      COCA COLA
## 4079         MX001 Abarrotes 28/06/2020 12:10:34                          BIMBO
## 4080         MX001 Abarrotes 28/06/2020 12:10:34                         FRESCA
## 4081         MX001 Abarrotes 22/06/2020 23:23:19                      COCA COLA
## 4082         MX001 Abarrotes 28/06/2020 12:12:11                         YEMINA
## 4083         MX001 Abarrotes 22/06/2020 23:23:29                          PEPSI
## 4084         MX001 Abarrotes 22/06/2020 23:23:54                        BOKADOS
## 4085         MX001 Abarrotes 22/06/2020 23:24:18                        DORITOS
## 4086         MX001 Abarrotes 22/06/2020 23:24:18                        CHEETOS
## 4087         MX001 Abarrotes 22/06/2020 23:24:18                        DORITOS
## 4088         MX001 Abarrotes 28/06/2020 12:13:20                           LALA
## 4089         MX001 Abarrotes 22/06/2020 23:24:18                           JOYA
## 4090         MX001 Abarrotes 22/06/2020 23:26:17                          BIMBO
## 4091         MX001 Abarrotes 22/06/2020 23:26:17                          BIMBO
## 4092         MX001 Abarrotes 22/06/2020 23:26:17                          BIMBO
## 4093         MX001 Abarrotes 28/06/2020 12:14:17                          PEPSI
## 4094         MX001 Abarrotes 22/06/2020 23:27:39                     TOPO CHICO
## 4095         MX001 Abarrotes 22/06/2020 23:27:39                        DORITOS
## 4096         MX001 Abarrotes 28/06/2020 12:15:32                      COCA COLA
## 4097         MX001 Abarrotes 28/06/2020 12:15:32                        ISADORA
## 4098         MX001 Abarrotes 28/06/2020 12:26:46                       SABRITAS
## 4099         MX001 Abarrotes 28/06/2020 12:26:46                       PAKETAXO
## 4100         MX001 Abarrotes 28/06/2020 12:26:46                       SABRITAS
## 4101         MX001 Abarrotes 28/06/2020 12:26:46                           LALA
## 4102         MX001 Abarrotes 28/06/2020 12:26:46                        TIC TAC
## 4103         MX001 Abarrotes 28/06/2020 12:27:19                    ELECTROPURA
## 4104         MX001 Abarrotes 22/06/2020 23:32:24                           TUNY
## 4105         MX001 Abarrotes 28/06/2020 12:27:42                        MIRINDA
## 4106         MX001 Abarrotes 22/06/2020 23:32:24                    ELECTROPURA
## 4107         MX001 Abarrotes 22/06/2020 23:32:53                           LINK
## 4108         MX001 Abarrotes 28/06/2020 12:32:07                           TANG
## 4109         MX001 Abarrotes 22/06/2020 23:33:14                           LALA
## 4110         MX001 Abarrotes 28/06/2020 12:34:36                          FLASH
## 4111         MX001 Abarrotes 28/06/2020 12:36:32                       MARLBORO
## 4112         MX001 Abarrotes 28/06/2020 12:36:32                        CHEETOS
## 4113         MX001 Abarrotes 28/06/2020 12:36:32                       CRUJITOS
## 4114         MX001 Abarrotes 28/06/2020 12:36:32                          BIMBO
## 4115         MX001 Abarrotes 22/06/2020 23:33:35                          PEPSI
## 4116         MX001 Abarrotes 28/06/2020 12:36:32                           TANG
## 4117         MX001 Abarrotes 22/06/2020 23:35:12                    5 ESTRELLAS
## 4118         MX001 Abarrotes 28/06/2020 12:45:28                      COCA COLA
## 4119         MX001 Abarrotes 28/06/2020 12:50:38                         YEMINA
## 4120         MX001 Abarrotes 22/06/2020 23:36:28                          PEPSI
## 4121         MX001 Abarrotes 22/06/2020 23:36:28                       MARUCHAN
## 4122         MX001 Abarrotes 28/06/2020 12:52:32                      COCA COLA
## 4123         MX001 Abarrotes 22/06/2020 23:37:28                          LUCAS
## 4124         MX001 Abarrotes 22/06/2020 23:37:28                       POWERADE
## 4125         MX001 Abarrotes 22/06/2020 23:37:28                       POWERADE
## 4126         MX001 Abarrotes 28/06/2020 12:59:39                       LIMONCHO
## 4127         MX001 Abarrotes 28/06/2020 12:59:39                      COCA COLA
## 4128         MX001 Abarrotes 28/06/2020 13:02:09                          PEPSI
## 4129         MX001 Abarrotes 28/06/2020 13:34:44                        DORITOS
## 4130         MX001 Abarrotes 28/06/2020 13:34:44                          PEPSI
## 4131         MX001 Abarrotes 28/06/2020 13:43:32                       CLORALEX
## 4132         MX001 Abarrotes 28/06/2020 13:43:32                        ENSUEÑO
## 4133         MX001 Abarrotes 28/06/2020 13:43:32                       MARINELA
## 4134         MX001 Abarrotes 22/06/2020 23:41:09                           LALA
## 4135         MX001 Abarrotes 28/06/2020 13:43:32                      COCA COLA
## 4136         MX001 Abarrotes 22/06/2020 23:41:17                          PEPSI
## 4137         MX001 Abarrotes 22/06/2020 23:41:35                          PEPSI
## 4138         MX001 Abarrotes 28/06/2020 13:48:07                      HABANERAS
## 4139         MX001 Abarrotes 22/06/2020 23:42:07                           LINK
## 4140         MX001 Abarrotes 28/06/2020 13:53:20                          BIMBO
## 4141         MX001 Abarrotes 28/06/2020 13:53:20                      COCA COLA
## 4142         MX001 Abarrotes 22/06/2020 23:42:41                          FLAMA
## 4143         MX001 Abarrotes 28/06/2020 13:53:45                        MIRINDA
## 4144         MX001 Abarrotes 28/06/2020 13:59:11     BLANCA NIEVES (DETERGENTE)
## 4145         MX001 Abarrotes 28/06/2020 14:00:54                      COCA COLA
## 4146         MX001 Abarrotes 22/06/2020 23:44:34                       TOSTITOS
## 4147         MX001 Abarrotes 22/06/2020 23:44:52                    NUTRI LECHE
## 4148         MX001 Abarrotes 28/06/2020 14:19:39                       BONAFONT
## 4149         MX001 Abarrotes 22/06/2020 23:48:24                      COCA COLA
## 4150         MX001 Abarrotes 22/06/2020 23:48:24                       SABRITAS
## 4151         MX001 Abarrotes 28/06/2020 14:25:38                            LEO
## 4152         MX001 Abarrotes 28/06/2020 14:25:38                       BE-LIGHT
## 4153         MX001 Abarrotes 23/06/2020 08:12:49                          BIMBO
## 4154         MX001 Abarrotes 28/06/2020 14:35:49                          PEPSI
## 4155         MX001 Abarrotes 23/06/2020 08:37:22                        ENSUEÑO
## 4156         MX001 Abarrotes 23/06/2020 08:37:22     BLANCA NIEVES (DETERGENTE)
## 4157         MX001 Abarrotes 28/06/2020 14:39:38                     LA COSTEÑA
## 4158         MX001 Abarrotes 23/06/2020 08:37:22                  VARIOS DANONE
## 4159         MX001 Abarrotes 23/06/2020 08:37:22                        YOPLAIT
## 4160         MX001 Abarrotes 23/06/2020 08:37:22                           ZOTE
## 4161         MX001 Abarrotes 23/06/2020 08:37:22                       CLORALEX
## 4162         MX001 Abarrotes 23/06/2020 08:37:22                          FLASH
## 4163         MX001 Abarrotes 23/06/2020 08:37:22                           ZOTE
## 4164         MX001 Abarrotes 23/06/2020 08:37:22                     KLEEN BEBE
## 4165         MX001 Abarrotes 23/06/2020 08:37:22                         SAVILE
## 4166         MX001 Abarrotes 23/06/2020 08:39:01                VELADORA MEXICO
## 4167         MX001 Abarrotes 23/06/2020 08:43:43                          BIMBO
## 4168         MX001 Abarrotes 28/06/2020 14:48:57                          PEPSI
## 4169         MX001 Abarrotes 23/06/2020 08:45:14                          BIMBO
## 4170         MX001 Abarrotes 28/06/2020 14:50:53                           LALA
## 4171         MX001 Abarrotes 28/06/2020 14:50:53                      COCA COLA
## 4172         MX001 Abarrotes 23/06/2020 08:45:14                           ZUKO
## 4173         MX001 Abarrotes 28/06/2020 14:51:47                     SABRITONES
## 4174         MX001 Abarrotes 28/06/2020 14:52:56       CLAMATO VUELVE A LA VIDA
## 4175         MX001 Abarrotes 28/06/2020 14:53:50                           JOYA
## 4176         MX001 Abarrotes 23/06/2020 08:52:58                           JOYA
## 4177         MX001 Abarrotes 23/06/2020 08:54:45                           LALA
## 4178         MX001 Abarrotes 23/06/2020 08:55:26                           LALA
## 4179         MX001 Abarrotes 23/06/2020 08:55:26                        NESCAFE
## 4180         MX001 Abarrotes 28/06/2020 14:58:46                          PEPSI
## 4181         MX001 Abarrotes 23/06/2020 09:04:40                      COCA COLA
## 4182         MX001 Abarrotes 23/06/2020 09:10:09                      COCA COLA
## 4183         MX001 Abarrotes 23/06/2020 09:11:04                    NUTRI LECHE
## 4184         MX001 Abarrotes 23/06/2020 09:15:29                         DAN UP
## 4185         MX001 Abarrotes 23/06/2020 09:20:41                    NUTRI LECHE
## 4186         MX001 Abarrotes 23/06/2020 09:28:10                      COCA COLA
## 4187         MX001 Abarrotes 28/06/2020 15:45:47                          HALLS
## 4188         MX001 Abarrotes 23/06/2020 09:34:54                     TOPO CHICO
## 4189         MX001 Abarrotes 23/06/2020 09:34:54                          JUMEX
## 4190         MX001 Abarrotes 28/06/2020 15:46:56                          PEPSI
## 4191         MX001 Abarrotes 28/06/2020 15:47:43                     VALLE FRUT
## 4192         MX001 Abarrotes 23/06/2020 09:48:26                          PEPSI
## 4193         MX001 Abarrotes 23/06/2020 09:48:26                         VELVET
## 4194         MX001 Abarrotes 23/06/2020 09:48:26                         SQUIRT
## 4195         MX001 Abarrotes 28/06/2020 15:47:56                    SANTA CLARA
## 4196         MX001 Abarrotes 23/06/2020 09:50:58                       POWERADE
## 4197         MX001 Abarrotes 23/06/2020 09:55:39                      DEL VALLE
## 4198         MX001 Abarrotes 28/06/2020 15:49:51                      COCA COLA
## 4199         MX001 Abarrotes 23/06/2020 09:58:18                           JOYA
## 4200         MX001 Abarrotes 23/06/2020 10:00:21                      COCA COLA
## 4201         MX001 Abarrotes 28/06/2020 15:52:37                           TUNY
## 4202         MX001 Abarrotes 28/06/2020 15:52:37                      COCA COLA
## 4203         MX001 Abarrotes 23/06/2020 10:04:37                          EPURA
## 4204         MX001 Abarrotes 28/06/2020 15:55:59                        CHEETOS
## 4205         MX001 Abarrotes 23/06/2020 10:10:33                          PEPSI
## 4206         MX001 Abarrotes 23/06/2020 10:10:33                        KINDER 
## 4207         MX001 Abarrotes 23/06/2020 10:12:59                           FOCA
## 4208         MX001 Abarrotes 23/06/2020 10:12:59                           FOCA
## 4209         MX001 Abarrotes 28/06/2020 15:56:19                     CHURRUMAIS
## 4210         MX001 Abarrotes 23/06/2020 10:13:19                    NUTRI LECHE
## 4211         MX001 Abarrotes 28/06/2020 15:58:29                         CHOKIS
## 4212         MX001 Abarrotes 23/06/2020 10:17:40                       GATORADE
## 4213         MX001 Abarrotes 28/06/2020 16:01:55                      COCA COLA
## 4214         MX001 Abarrotes 28/06/2020 16:03:57                  ROGELIO BUENO
## 4215         MX001 Abarrotes 28/06/2020 16:03:57                           ZOTE
## 4216         MX001 Abarrotes 28/06/2020 16:03:57                         TECATE
## 4217         MX001 Abarrotes 28/06/2020 16:03:57                         NORVER
## 4218         MX001 Abarrotes 23/06/2020 10:19:34                          BIMBO
## 4219         MX001 Abarrotes 23/06/2020 10:23:42                     TOPO CHICO
## 4220         MX001 Abarrotes 23/06/2020 10:24:13                    ELECTROPURA
## 4221         MX001 Abarrotes 23/06/2020 10:24:13                     VALLE FRUT
## 4222         MX001 Abarrotes 28/06/2020 16:11:35                          JUMEX
## 4223         MX001 Abarrotes 28/06/2020 16:11:35                      COCA COLA
## 4224         MX001 Abarrotes 28/06/2020 16:11:35                        ISADORA
## 4225         MX001 Abarrotes 23/06/2020 10:26:15                          PEPSI
## 4226         MX001 Abarrotes 28/06/2020 16:12:47                      COCA COLA
## 4227         MX001 Abarrotes 23/06/2020 10:30:49                         TECATE
## 4228         MX001 Abarrotes 28/06/2020 16:13:08                        CHEETOS
## 4229         MX001 Abarrotes 28/06/2020 16:13:34                          PEPSI
## 4230         MX001 Abarrotes 28/06/2020 16:13:34                         NEVADA
## 4231         MX001 Abarrotes 28/06/2020 16:14:21                        KINDER 
## 4232         MX001 Abarrotes 23/06/2020 10:32:57                          PEPSI
## 4233         MX001 Abarrotes 28/06/2020 16:17:46                          KNORR
## 4234         MX001 Abarrotes 23/06/2020 10:33:16                         TECATE
## 4235         MX001 Abarrotes 28/06/2020 16:17:58                      COCA COLA
## 4236         MX001 Abarrotes 28/06/2020 16:21:22                       TOSTILEO
## 4237         MX001 Abarrotes 28/06/2020 16:21:22                          PEPSI
## 4238         MX001 Abarrotes 23/06/2020 10:41:41                      COCA COLA
## 4239         MX001 Abarrotes 23/06/2020 10:42:42                          PEPSI
## 4240         MX001 Abarrotes 28/06/2020 16:23:41                      COCA COLA
## 4241         MX001 Abarrotes 28/06/2020 16:24:21                      COCA COLA
## 4242         MX001 Abarrotes 23/06/2020 10:43:48                          PEPSI
## 4243         MX001 Abarrotes 23/06/2020 10:43:48                COCA COLA LIGHT
## 4244         MX001 Abarrotes 23/06/2020 10:53:24                      COCA COLA
## 4245         MX001 Abarrotes 28/06/2020 16:26:20                           LALA
## 4246         MX001 Abarrotes 28/06/2020 16:26:52                       TOSTILEO
## 4247         MX001 Abarrotes 28/06/2020 16:26:52                       TOSTILEO
## 4248         MX001 Abarrotes 28/06/2020 16:26:52                    PAPIRRINGAS
## 4249         MX001 Abarrotes 23/06/2020 10:54:11                          PEPSI
## 4250         MX001 Abarrotes 23/06/2020 10:56:57              ARCOIRIS (GAMESA)
## 4251         MX001 Abarrotes 23/06/2020 10:56:57                       POWERADE
## 4252         MX001 Abarrotes 28/06/2020 16:27:07                    PEPSI LIGHT
## 4253         MX001 Abarrotes 28/06/2020 16:30:24                      COCA COLA
## 4254         MX001 Abarrotes 28/06/2020 16:31:15                      DEL VALLE
## 4255         MX001 Abarrotes 28/06/2020 16:31:15                       CRUJITOS
## 4256         MX001 Abarrotes 28/06/2020 16:31:15                       PAKETAXO
## 4257         MX001 Abarrotes 23/06/2020 10:58:14                     LA COSTEÑA
## 4258         MX001 Abarrotes 28/06/2020 16:31:15                      DEL VALLE
## 4259         MX001 Abarrotes 28/06/2020 16:32:42                       PAKETAXO
## 4260         MX001 Abarrotes 28/06/2020 16:32:42                        DORITOS
## 4261         MX001 Abarrotes 28/06/2020 16:32:42                      DEL VALLE
## 4262         MX001 Abarrotes 23/06/2020 11:00:41                      COCA COLA
## 4263         MX001 Abarrotes 28/06/2020 16:34:28                          PEPSI
## 4264         MX001 Abarrotes 23/06/2020 11:06:26                          PEPSI
## 4265         MX001 Abarrotes 28/06/2020 16:36:12                      COCA COLA
## 4266         MX001 Abarrotes 23/06/2020 11:07:09                           ZUKO
## 4267         MX001 Abarrotes 28/06/2020 16:43:37                      CONSOMATE
## 4268         MX001 Abarrotes 23/06/2020 11:07:59                        CHEETOS
## 4269         MX001 Abarrotes 23/06/2020 11:09:22                      COCA COLA
## 4270         MX001 Abarrotes 28/06/2020 16:51:42                         VELVET
## 4271         MX001 Abarrotes 28/06/2020 16:51:42                      CONVERMEX
## 4272         MX001 Abarrotes 28/06/2020 16:51:42                       JARRITOS
## 4273         MX001 Abarrotes 28/06/2020 16:51:42                      COCA COLA
## 4274         MX001 Abarrotes 28/06/2020 16:51:42                      CONVERMEX
## 4275         MX001 Abarrotes 28/06/2020 16:52:08                  TOPITOS (BK2)
## 4276         MX001 Abarrotes 28/06/2020 16:52:08                           JOYA
## 4277         MX001 Abarrotes 28/06/2020 16:52:32                          MAMUT
## 4278         MX001 Abarrotes 28/06/2020 16:52:51                           LINK
## 4279         MX001 Abarrotes 23/06/2020 11:16:30                          BIMBO
## 4280         MX001 Abarrotes 23/06/2020 11:16:30                          BIMBO
## 4281         MX001 Abarrotes 23/06/2020 11:16:30                          PINOL
## 4282         MX001 Abarrotes 23/06/2020 11:16:30                      NORTEÑITA
## 4283         MX001 Abarrotes 23/06/2020 11:16:30                           BREF
## 4284         MX001 Abarrotes 28/06/2020 16:53:46                       MARINELA
## 4285         MX001 Abarrotes 28/06/2020 16:54:16                        ENCANTO
## 4286         MX001 Abarrotes 28/06/2020 16:54:16                        DORITOS
## 4287         MX001 Abarrotes 28/06/2020 16:54:16                      COCA COLA
## 4288         MX001 Abarrotes 28/06/2020 16:54:16                     CHURRUMAIS
## 4289         MX001 Abarrotes 23/06/2020 11:28:51                          ELITE
## 4290         MX001 Abarrotes 23/06/2020 11:34:09                        CLAMATO
## 4291         MX001 Abarrotes 23/06/2020 11:34:09                     TOPO CHICO
## 4292         MX001 Abarrotes 28/06/2020 16:55:43                          PEPSI
## 4293         MX001 Abarrotes 23/06/2020 12:23:35                           JOYA
## 4294         MX001 Abarrotes 28/06/2020 16:55:43                      CONVERMEX
## 4295         MX001 Abarrotes 28/06/2020 16:56:29     BLANCA NIEVES (DETERGENTE)
## 4296         MX001 Abarrotes 23/06/2020 12:28:49                          PEPSI
## 4297         MX001 Abarrotes 23/06/2020 12:28:49                    NUTRI LECHE
## 4298         MX001 Abarrotes 28/06/2020 16:56:55                          PEPSI
## 4299         MX001 Abarrotes 28/06/2020 16:56:55                          PEPSI
## 4300         MX001 Abarrotes 23/06/2020 12:31:41                          PEPSI
## 4301         MX001 Abarrotes 28/06/2020 16:57:53                        ENCANTO
## 4302         MX001 Abarrotes 28/06/2020 16:57:53                  TOPITOS (BK2)
## 4303         MX001 Abarrotes 28/06/2020 16:57:53                          PEPSI
## 4304         MX001 Abarrotes 23/06/2020 12:34:03                      CONSOMATE
## 4305         MX001 Abarrotes 28/06/2020 16:57:53                         SQUIRT
## 4306         MX001 Abarrotes 23/06/2020 12:37:02                      CONSOMATE
## 4307         MX001 Abarrotes 23/06/2020 12:37:02                           ZUKO
## 4308         MX001 Abarrotes 23/06/2020 12:37:15                          PULPY
## 4309         MX001 Abarrotes 28/06/2020 17:01:52                      DEL VALLE
## 4310         MX001 Abarrotes 23/06/2020 12:38:45                          PEPSI
## 4311         MX001 Abarrotes 28/06/2020 17:03:44                           LINK
## 4312         MX001 Abarrotes 28/06/2020 17:08:22                       TOSTITOS
## 4313         MX001 Abarrotes 28/06/2020 17:08:22                        CLAMATO
## 4314         MX001 Abarrotes 23/06/2020 12:40:02                      DEL MONTE
## 4315         MX001 Abarrotes 23/06/2020 12:40:22                      COCA COLA
## 4316         MX001 Abarrotes 23/06/2020 12:48:17                       PAKETAXO
## 4317         MX001 Abarrotes 23/06/2020 12:49:06                       POWERADE
## 4318         MX001 Abarrotes 28/06/2020 17:15:31                        DORITOS
## 4319         MX001 Abarrotes 23/06/2020 12:50:27                          PICOT
## 4320         MX001 Abarrotes 23/06/2020 12:52:51                       MARUCHAN
## 4321         MX001 Abarrotes 23/06/2020 12:52:51                       MARUCHAN
## 4322         MX001 Abarrotes 23/06/2020 12:54:08                      COCA COLA
## 4323         MX001 Abarrotes 28/06/2020 17:18:42                         TECATE
## 4324         MX001 Abarrotes 28/06/2020 17:18:42                      PALL MALL
## 4325         MX001 Abarrotes 28/06/2020 17:18:42                          EPURA
## 4326         MX001 Abarrotes 23/06/2020 12:56:42                       MARINELA
## 4327         MX001 Abarrotes 28/06/2020 17:19:16                        BOKADOS
## 4328         MX001 Abarrotes 23/06/2020 12:56:42                          PEPSI
## 4329         MX001 Abarrotes 23/06/2020 13:01:09                      COCA COLA
## 4330         MX001 Abarrotes 28/06/2020 17:20:47                        BOKADOS
## 4331         MX001 Abarrotes 28/06/2020 17:20:47                        MASSISO
## 4332         MX001 Abarrotes 28/06/2020 17:20:47                        RUFFLES
## 4333         MX001 Abarrotes 28/06/2020 17:20:47                        DORITOS
## 4334         MX001 Abarrotes 23/06/2020 13:03:05                          PEPSI
## 4335         MX001 Abarrotes 28/06/2020 17:20:47                        BOKADOS
## 4336         MX001 Abarrotes 28/06/2020 17:20:47                    RANCHERITOS
## 4337         MX001 Abarrotes 28/06/2020 17:20:47                          PEPSI
## 4338         MX001 Abarrotes 23/06/2020 13:03:05                          EPURA
## 4339         MX001 Abarrotes 28/06/2020 17:21:18                        CHEETOS
## 4340         MX001 Abarrotes 23/06/2020 13:10:06                           TANG
## 4341         MX001 Abarrotes 28/06/2020 17:22:52                       MARLBORO
## 4342         MX001 Abarrotes 23/06/2020 13:10:24                           LINK
## 4343         MX001 Abarrotes 28/06/2020 17:24:42             TOSTADITAS HIDALGO
## 4344         MX001 Abarrotes 23/06/2020 13:14:04                           FOCA
## 4345         MX001 Abarrotes 23/06/2020 13:14:04                        ENSUEÑO
## 4346         MX001 Abarrotes 23/06/2020 13:14:04                          PEPSI
## 4347         MX001 Abarrotes 28/06/2020 17:26:10                         DANONE
## 4348         MX001 Abarrotes 28/06/2020 17:28:12                    NUTRI LECHE
## 4349         MX001 Abarrotes 28/06/2020 17:28:12                          PEPSI
## 4350         MX001 Abarrotes 23/06/2020 13:22:52                           TANG
## 4351         MX001 Abarrotes 28/06/2020 17:31:23                        YOPLAIT
## 4352         MX001 Abarrotes 23/06/2020 13:25:37                      COCA COLA
## 4353         MX001 Abarrotes 23/06/2020 13:29:27                      COCA COLA
## 4354         MX001 Abarrotes 23/06/2020 13:32:42                       MARUCHAN
## 4355         MX001 Abarrotes 28/06/2020 17:33:47                          PEPSI
## 4356         MX001 Abarrotes 23/06/2020 13:33:42                         DANONE
## 4357         MX001 Abarrotes 23/06/2020 13:33:42             SALADITAS (GAMESA)
## 4358         MX001 Abarrotes 23/06/2020 13:33:42                  VARIOS DANONE
## 4359         MX001 Abarrotes 23/06/2020 13:33:42                       DANONINO
## 4360         MX001 Abarrotes 23/06/2020 13:33:42                COCA COLA LIGHT
## 4361         MX001 Abarrotes 23/06/2020 13:33:59                            LEO
## 4362         MX001 Abarrotes 28/06/2020 17:36:47                          PEPSI
## 4363         MX001 Abarrotes 23/06/2020 13:45:30                      COCA COLA
## 4364         MX001 Abarrotes 28/06/2020 17:38:16                         SQUIRT
## 4365         MX001 Abarrotes 23/06/2020 13:46:44                          PEPSI
## 4366         MX001 Abarrotes 28/06/2020 17:39:35                      COCA COLA
## 4367         MX001 Abarrotes 23/06/2020 13:49:11                     LA COSTEÑA
## 4368         MX001 Abarrotes 23/06/2020 13:49:11                           TANG
## 4369         MX001 Abarrotes 23/06/2020 13:51:48                          BIMBO
## 4370         MX001 Abarrotes 23/06/2020 13:51:48                    PEPSI LIGHT
## 4371         MX001 Abarrotes 23/06/2020 13:55:47                        DORITOS
## 4372         MX001 Abarrotes 23/06/2020 13:55:47                       PAKETAXO
## 4373         MX001 Abarrotes 28/06/2020 17:43:57                        BOKADOS
## 4374         MX001 Abarrotes 23/06/2020 13:57:17                          KNORR
## 4375         MX001 Abarrotes 28/06/2020 17:43:57                    PEPSI LIGHT
## 4376         MX001 Abarrotes 28/06/2020 17:43:57                          KOTEX
## 4377         MX001 Abarrotes 28/06/2020 17:43:57                        KINDER 
## 4378         MX001 Abarrotes 28/06/2020 17:43:57                         BOGO´S
## 4379         MX001 Abarrotes 28/06/2020 17:43:57                        KINDER 
## 4380         MX001 Abarrotes 28/06/2020 17:44:52       CLAMATO VUELVE A LA VIDA
## 4381         MX001 Abarrotes 23/06/2020 13:58:36                       POWERADE
## 4382         MX001 Abarrotes 28/06/2020 17:48:51                        BOKADOS
## 4383         MX001 Abarrotes 28/06/2020 17:50:43                           LALA
## 4384         MX001 Abarrotes 28/06/2020 17:50:43                          PEPSI
## 4385         MX001 Abarrotes 23/06/2020 14:01:25                         TECATE
## 4386         MX001 Abarrotes 28/06/2020 17:50:43                      DEL VALLE
## 4387         MX001 Abarrotes 23/06/2020 14:03:26                      COCA COLA
## 4388         MX001 Abarrotes 28/06/2020 17:53:47                EL GALLO DE ORO
## 4389         MX001 Abarrotes 23/06/2020 14:05:31                          PEPSI
## 4390         MX001 Abarrotes 23/06/2020 14:06:11                          MAMUT
## 4391         MX001 Abarrotes 28/06/2020 18:00:58                        CALAHUA
## 4392         MX001 Abarrotes 28/06/2020 18:01:56                        ENCANTO
## 4393         MX001 Abarrotes 28/06/2020 18:01:56                          PEPSI
## 4394         MX001 Abarrotes 23/06/2020 14:08:57                         ENRE-2
## 4395         MX001 Abarrotes 23/06/2020 14:08:57                      COCA COLA
## 4396         MX001 Abarrotes 23/06/2020 14:09:25                          PEPSI
## 4397         MX001 Abarrotes 28/06/2020 18:09:16                         SQUIRT
## 4398         MX001 Abarrotes 23/06/2020 14:16:28                          PEPSI
## 4399         MX001 Abarrotes 28/06/2020 18:12:09                          BIMBO
## 4400         MX001 Abarrotes 28/06/2020 18:12:09                            LEO
## 4401         MX001 Abarrotes 28/06/2020 18:12:48                         SQUIRT
## 4402         MX001 Abarrotes 23/06/2020 14:32:30                         ACT II
## 4403         MX001 Abarrotes 28/06/2020 18:15:07                        RUFFLES
## 4404         MX001 Abarrotes 28/06/2020 18:15:07                          BIMBO
## 4405         MX001 Abarrotes 23/06/2020 14:37:55                       POWERADE
## 4406         MX001 Abarrotes 28/06/2020 18:15:44                     CHURRUMAIS
## 4407         MX001 Abarrotes 28/06/2020 18:15:44                    NUTRI LECHE
## 4408         MX001 Abarrotes 28/06/2020 18:16:18                           JOYA
## 4409         MX001 Abarrotes 28/06/2020 18:26:18                        CHEETOS
## 4410         MX001 Abarrotes 28/06/2020 18:27:16                     MR MUSCULO
## 4411         MX001 Abarrotes 28/06/2020 18:36:39                       TOSTITOS
## 4412         MX001 Abarrotes 23/06/2020 14:41:28                          EPURA
## 4413         MX001 Abarrotes 23/06/2020 14:41:49                      COCA COLA
## 4414         MX001 Abarrotes 28/06/2020 18:37:52                        CAMELIA
## 4415         MX001 Abarrotes 23/06/2020 14:42:49                        DORITOS
## 4416         MX001 Abarrotes 28/06/2020 18:38:17                        DORITOS
## 4417         MX001 Abarrotes 28/06/2020 18:38:17                           LALA
## 4418         MX001 Abarrotes 28/06/2020 18:38:17                       TOSTITOS
## 4419         MX001 Abarrotes 23/06/2020 14:43:54                        CHEETOS
## 4420         MX001 Abarrotes 28/06/2020 18:45:49                       TOSTILEO
## 4421         MX001 Abarrotes 28/06/2020 18:45:49                        RUFFLES
## 4422         MX001 Abarrotes 28/06/2020 18:45:49                           LALA
## 4423         MX001 Abarrotes 28/06/2020 18:45:49                            FUD
## 4424         MX001 Abarrotes 28/06/2020 18:45:49                      COCA COLA
## 4425         MX001 Abarrotes 23/06/2020 14:46:17                          SALVO
## 4426         MX001 Abarrotes 23/06/2020 14:46:17                           ZOTE
## 4427         MX001 Abarrotes 28/06/2020 18:46:59              EMPERADOR (SENZO)
## 4428         MX001 Abarrotes 28/06/2020 18:49:17                          JUMEX
## 4429         MX001 Abarrotes 28/06/2020 18:51:30                      CONSOMATE
## 4430         MX001 Abarrotes 23/06/2020 14:52:45                          PEPSI
## 4431         MX001 Abarrotes 28/06/2020 18:57:14                      COCA COLA
## 4432         MX001 Abarrotes 28/06/2020 18:57:30                         VELVET
## 4433         MX001 Abarrotes 28/06/2020 18:58:39                        CHEETOS
## 4434         MX001 Abarrotes 23/06/2020 15:10:52                       PAKETAXO
## 4435         MX001 Abarrotes 23/06/2020 15:10:52                    RANCHERITOS
## 4436         MX001 Abarrotes 28/06/2020 18:59:45                    LA BOTANERA
## 4437         MX001 Abarrotes 28/06/2020 18:59:45                      LA SIERRA
## 4438         MX001 Abarrotes 28/06/2020 19:03:14                        BOKADOS
## 4439         MX001 Abarrotes 28/06/2020 19:03:30                           BIDA
## 4440         MX001 Abarrotes 23/06/2020 15:24:38                        RUFFLES
## 4441         MX001 Abarrotes 23/06/2020 15:24:38                        CHEETOS
## 4442         MX001 Abarrotes 23/06/2020 15:24:38                        CHEETOS
## 4443         MX001 Abarrotes 23/06/2020 15:24:38                      COCA COLA
## 4444         MX001 Abarrotes 28/06/2020 19:04:07                         SQUIRT
## 4445         MX001 Abarrotes 28/06/2020 19:05:00                            EGO
## 4446         MX001 Abarrotes 28/06/2020 19:05:59                       PAKETAXO
## 4447         MX001 Abarrotes 23/06/2020 15:25:04                          PEPSI
## 4448         MX001 Abarrotes 28/06/2020 19:05:59                      COCA COLA
## 4449         MX001 Abarrotes 28/06/2020 19:05:59                          LUCAS
## 4450         MX001 Abarrotes 28/06/2020 19:14:17                          PEPSI
## 4451         MX001 Abarrotes 23/06/2020 15:29:05                        CHEETOS
## 4452         MX001 Abarrotes 28/06/2020 19:14:36                         SQUIRT
## 4453         MX001 Abarrotes 28/06/2020 19:15:39                          BOING
## 4454         MX001 Abarrotes 28/06/2020 19:15:39                       PAKETAXO
## 4455         MX001 Abarrotes 28/06/2020 19:15:39                      COCA COLA
## 4456         MX001 Abarrotes 23/06/2020 15:29:41                         FRESCA
## 4457         MX001 Abarrotes 23/06/2020 15:31:05                          PEPSI
## 4458         MX001 Abarrotes 28/06/2020 19:19:35                          LUCAS
## 4459         MX001 Abarrotes 28/06/2020 19:19:35                           EPIX
## 4460         MX001 Abarrotes 23/06/2020 15:32:03                           ZUKO
## 4461         MX001 Abarrotes 23/06/2020 15:32:24                          PEPSI
## 4462         MX001 Abarrotes 28/06/2020 19:23:01                        DORITOS
## 4463         MX001 Abarrotes 28/06/2020 19:23:01                     HELLMANN´S
## 4464         MX001 Abarrotes 28/06/2020 19:23:01                          BIMBO
## 4465         MX001 Abarrotes 23/06/2020 15:33:39                        KINDER 
## 4466         MX001 Abarrotes 23/06/2020 15:33:39                   BUBBA XTREME
## 4467         MX001 Abarrotes 23/06/2020 15:34:19                        LA FINA
## 4468         MX001 Abarrotes 23/06/2020 15:34:19     BLANCA NIEVES (DETERGENTE)
## 4469         MX001 Abarrotes 23/06/2020 15:34:40                          PEPSI
## 4470         MX001 Abarrotes 28/06/2020 19:24:39                      COCA COLA
## 4471         MX001 Abarrotes 28/06/2020 19:24:39                COCA COLA LIGHT
## 4472         MX001 Abarrotes 28/06/2020 19:24:39                           JOYA
## 4473         MX001 Abarrotes 23/06/2020 15:37:02                        DORITOS
## 4474         MX001 Abarrotes 28/06/2020 19:26:55                      DEL MONTE
## 4475         MX001 Abarrotes 23/06/2020 15:38:38                           LINK
## 4476         MX001 Abarrotes 28/06/2020 19:27:37                       SEVEN UP
## 4477         MX001 Abarrotes 28/06/2020 19:30:08                      COCA COLA
## 4478         MX001 Abarrotes 28/06/2020 19:31:29                         TECATE
## 4479         MX001 Abarrotes 23/06/2020 15:46:10                           TANG
## 4480         MX001 Abarrotes 23/06/2020 15:47:21                        DORITOS
## 4481         MX001 Abarrotes 23/06/2020 15:47:21                          BIMBO
## 4482         MX001 Abarrotes 23/06/2020 15:47:21                          PEPSI
## 4483         MX001 Abarrotes 23/06/2020 15:48:00                      COCA COLA
## 4484         MX001 Abarrotes 23/06/2020 15:48:00                    LA BOTANERA
## 4485         MX001 Abarrotes 28/06/2020 19:32:33                      COCA COLA
## 4486         MX001 Abarrotes 23/06/2020 15:48:00                        MONARCA
## 4487         MX001 Abarrotes 28/06/2020 19:32:33                 COCA COLA ZERO
## 4488         MX001 Abarrotes 28/06/2020 19:33:10                           TANG
## 4489         MX001 Abarrotes 23/06/2020 15:48:52                      CONSOMATE
## 4490         MX001 Abarrotes 28/06/2020 19:35:52                          PEPSI
## 4491         MX001 Abarrotes 28/06/2020 19:35:52                        CAMELIA
## 4492         MX001 Abarrotes 23/06/2020 15:49:26                          PEPSI
## 4493         MX001 Abarrotes 28/06/2020 19:35:52                         TECATE
## 4494         MX001 Abarrotes 28/06/2020 19:35:52                EL GALLO DE ORO
## 4495         MX001 Abarrotes 28/06/2020 19:35:52                      DEL VALLE
## 4496         MX001 Abarrotes 28/06/2020 19:36:19                            SOL
## 4497         MX001 Abarrotes 23/06/2020 15:50:28                        LA FINA
## 4498         MX001 Abarrotes 23/06/2020 15:50:50                      CONSOMATE
## 4499         MX001 Abarrotes 23/06/2020 15:50:56                          PEPSI
## 4500         MX001 Abarrotes 23/06/2020 15:51:17                     LA COSTEÑA
## 4501         MX001 Abarrotes 23/06/2020 15:56:10                       SABRITAS
## 4502         MX001 Abarrotes 23/06/2020 15:56:10                       TOSTITOS
## 4503         MX001 Abarrotes 23/06/2020 15:56:10                    RANCHERITOS
## 4504         MX001 Abarrotes 28/06/2020 19:41:24                      COCA COLA
## 4505         MX001 Abarrotes 23/06/2020 15:56:48                          BIMBO
## 4506         MX001 Abarrotes 23/06/2020 15:58:05                      COCA COLA
## 4507         MX001 Abarrotes 28/06/2020 19:42:42                     MILPA REAL
## 4508         MX001 Abarrotes 23/06/2020 15:58:05                           JOYA
## 4509         MX001 Abarrotes 28/06/2020 19:43:55                    NUTRI LECHE
## 4510         MX001 Abarrotes 28/06/2020 19:43:55                  VARIOS DANONE
## 4511         MX001 Abarrotes 28/06/2020 19:43:55                       FRUTIMAX
## 4512         MX001 Abarrotes 28/06/2020 19:44:30                      EL DORADO
## 4513         MX001 Abarrotes 23/06/2020 15:59:15                      COCA COLA
## 4514         MX001 Abarrotes 28/06/2020 19:44:30                           LALA
## 4515         MX001 Abarrotes 23/06/2020 16:00:33                          PEPSI
## 4516         MX001 Abarrotes 28/06/2020 19:51:03                          PEPSI
## 4517         MX001 Abarrotes 28/06/2020 20:00:05                           ZOTE
## 4518         MX001 Abarrotes 23/06/2020 16:09:10                        CHEETOS
## 4519         MX001 Abarrotes 28/06/2020 20:00:33                         TECATE
## 4520         MX001 Abarrotes 23/06/2020 16:10:28                        ENCANTO
## 4521         MX001 Abarrotes 23/06/2020 16:10:28                        RUFFLES
## 4522         MX001 Abarrotes 28/06/2020 20:03:06                       TOSTITOS
## 4523         MX001 Abarrotes 28/06/2020 20:03:06                          EPURA
## 4524         MX001 Abarrotes 23/06/2020 16:14:52                       POWERADE
## 4525         MX001 Abarrotes 23/06/2020 16:16:08                     LA COSTEÑA
## 4526         MX001 Abarrotes 23/06/2020 16:16:08                      COCA COLA
## 4527         MX001 Abarrotes 23/06/2020 16:16:08                      CONSOMATE
## 4528         MX001 Abarrotes 28/06/2020 20:04:22                 ZONA DEL SABOR
## 4529         MX001 Abarrotes 23/06/2020 16:18:23             SALADITAS (GAMESA)
## 4530         MX001 Abarrotes 28/06/2020 20:04:40                         ENRE-2
## 4531         MX001 Abarrotes 28/06/2020 20:05:35                       NUTRIOLI
## 4532         MX001 Abarrotes 23/06/2020 16:20:08                        LA FINA
## 4533         MX001 Abarrotes 23/06/2020 16:20:08                          PEPSI
## 4534         MX001 Abarrotes 23/06/2020 16:20:08                           TANG
## 4535         MX001 Abarrotes 28/06/2020 20:07:28                       DIAMANTE
## 4536         MX001 Abarrotes 28/06/2020 20:09:17                       SABRITAS
## 4537         MX001 Abarrotes 28/06/2020 20:39:17                          JUMEX
## 4538         MX001 Abarrotes 23/06/2020 16:26:10                     TOPO CHICO
## 4539         MX001 Abarrotes 23/06/2020 16:29:25                      COCA COLA
## 4540         MX001 Abarrotes 23/06/2020 16:29:25                          PICOT
## 4541         MX001 Abarrotes 28/06/2020 20:47:44                        CHEETOS
## 4542         MX001 Abarrotes 23/06/2020 16:37:25                        ENSUEÑO
## 4543         MX001 Abarrotes 23/06/2020 16:37:25                            ACE
## 4544         MX001 Abarrotes 23/06/2020 16:39:01                          BIMBO
## 4545         MX001 Abarrotes 23/06/2020 16:39:01                     LA COSTEÑA
## 4546         MX001 Abarrotes 23/06/2020 16:39:01                     HELLMANN´S
## 4547         MX001 Abarrotes 23/06/2020 16:39:01                     BLUE HOUSE
## 4548         MX001 Abarrotes 28/06/2020 20:54:07                       MARUCHAN
## 4549         MX001 Abarrotes 28/06/2020 20:54:07                     VALLE FRUT
## 4550         MX001 Abarrotes 23/06/2020 16:39:46                      COCA COLA
## 4551         MX001 Abarrotes 28/06/2020 20:55:57                        DORITOS
## 4552         MX001 Abarrotes 28/06/2020 20:56:41               CLEMENTE JACQUES
## 4553         MX001 Abarrotes 23/06/2020 16:42:37                       POWERADE
## 4554         MX001 Abarrotes 23/06/2020 16:42:58                       FRUTIMAX
## 4555         MX001 Abarrotes 28/06/2020 20:57:37                            LEO
## 4556         MX001 Abarrotes 23/06/2020 16:43:35                        PRISPAS
## 4557         MX001 Abarrotes 23/06/2020 16:43:35                        BOKADOS
## 4558         MX001 Abarrotes 28/06/2020 20:57:37                        CHEETOS
## 4559         MX001 Abarrotes 28/06/2020 20:57:37                      DEL VALLE
## 4560         MX001 Abarrotes 23/06/2020 16:45:26             SALADITAS (GAMESA)
## 4561         MX001 Abarrotes 28/06/2020 20:59:48                        CHEETOS
## 4562         MX001 Abarrotes 23/06/2020 16:45:58                          PEPSI
## 4563         MX001 Abarrotes 23/06/2020 16:46:29                          PEPSI
## 4564         MX001 Abarrotes 28/06/2020 20:59:58                     BLUE HOUSE
## 4565         MX001 Abarrotes 28/06/2020 21:01:21                       SUAVITEL
## 4566         MX001 Abarrotes 23/06/2020 16:53:22                          FLASH
## 4567         MX001 Abarrotes 23/06/2020 16:54:27                        DORITOS
## 4568         MX001 Abarrotes 23/06/2020 16:54:27                      COCA COLA
## 4569         MX001 Abarrotes 28/06/2020 21:11:12                          PEPSI
## 4570         MX001 Abarrotes 23/06/2020 16:55:28                       PEDIGREE
## 4571         MX001 Abarrotes 23/06/2020 16:55:52                         CHIMEX
## 4572         MX001 Abarrotes 28/06/2020 21:11:42                          PULPY
## 4573         MX001 Abarrotes 23/06/2020 16:56:37                          PEPSI
## 4574         MX001 Abarrotes 23/06/2020 16:58:26                           ROMA
## 4575         MX001 Abarrotes 23/06/2020 16:58:52                           INCA
## 4576         MX001 Abarrotes 23/06/2020 16:59:09                      COCA COLA
## 4577         MX001 Abarrotes 28/06/2020 21:26:08                          BIMBO
## 4578         MX001 Abarrotes 23/06/2020 17:00:06                           LALA
## 4579         MX001 Abarrotes 28/06/2020 21:26:34                          PEPSI
## 4580         MX001 Abarrotes 28/06/2020 21:38:16                            SOL
## 4581         MX001 Abarrotes 28/06/2020 21:41:48                           TANG
## 4582         MX001 Abarrotes 28/06/2020 21:43:19                          PEPSI
## 4583         MX001 Abarrotes 28/06/2020 21:44:00             SALADITAS (GAMESA)
## 4584         MX001 Abarrotes 28/06/2020 21:44:00                          PEPSI
## 4585         MX001 Abarrotes 23/06/2020 17:04:42                          PEPSI
## 4586         MX001 Abarrotes 23/06/2020 17:04:42                          PEPSI
## 4587         MX001 Abarrotes 23/06/2020 17:04:42                      NORTEÑITA
## 4588         MX001 Abarrotes 23/06/2020 17:08:23                          BIMBO
## 4589         MX001 Abarrotes 23/06/2020 17:08:23                     LA COSTEÑA
## 4590         MX001 Abarrotes 23/06/2020 17:08:23                          PEPSI
## 4591         MX001 Abarrotes 23/06/2020 17:08:23                      DEL MONTE
## 4592         MX001 Abarrotes 28/06/2020 21:49:47                           LALA
## 4593         MX001 Abarrotes 23/06/2020 17:14:03                      CABALLITO
## 4594         MX001 Abarrotes 23/06/2020 17:17:47             SALADITAS (GAMESA)
## 4595         MX001 Abarrotes 28/06/2020 21:50:49                          HALLS
## 4596         MX001 Abarrotes 28/06/2020 21:51:28                         CHOKIS
## 4597         MX001 Abarrotes 28/06/2020 21:51:28                          BIMBO
## 4598         MX001 Abarrotes 28/06/2020 21:51:28                         DAN UP
## 4599         MX001 Abarrotes 28/06/2020 21:52:19                          PEPSI
## 4600         MX001 Abarrotes 23/06/2020 17:22:53                      COCA COLA
## 4601         MX001 Abarrotes 23/06/2020 17:23:51                        CHEETOS
## 4602         MX001 Abarrotes 28/06/2020 21:55:21                         SQUIRT
## 4603         MX001 Abarrotes 28/06/2020 22:04:32                     LA VILLITA
## 4604         MX001 Abarrotes 23/06/2020 17:25:43                          JUMEX
## 4605         MX001 Abarrotes 28/06/2020 22:09:28                       MARLBORO
## 4606         MX001 Abarrotes 28/06/2020 22:09:53                      BUBU LUBU
## 4607         MX001 Abarrotes 23/06/2020 17:27:38                      COCA COLA
## 4608         MX001 Abarrotes 28/06/2020 22:10:59                          JUMEX
## 4609         MX001 Abarrotes 28/06/2020 22:10:59                          BIMBO
## 4610         MX001 Abarrotes 23/06/2020 17:36:52                VELADORA MEXICO
## 4611         MX001 Abarrotes 28/06/2020 22:20:01                       CLORALEX
## 4612         MX001 Abarrotes 28/06/2020 22:21:41                        PRISPAS
## 4613         MX001 Abarrotes 23/06/2020 17:40:24                          PEPSI
## 4614         MX001 Abarrotes 23/06/2020 17:40:49                      COCA COLA
## 4615         MX001 Abarrotes 28/06/2020 22:24:46                           ZOTE
## 4616         MX001 Abarrotes 28/06/2020 22:24:46                            LEO
## 4617         MX001 Abarrotes 28/06/2020 22:25:30                         DANONE
## 4618         MX001 Abarrotes 23/06/2020 17:42:44                LEO CACHAHUATES
## 4619         MX001 Abarrotes 23/06/2020 17:42:44                      COCA COLA
## 4620         MX001 Abarrotes 23/06/2020 17:43:25                   BUBBA XTREME
## 4621         MX001 Abarrotes 28/06/2020 22:28:02                     LA COSTEÑA
## 4622         MX001 Abarrotes 28/06/2020 22:28:37                          BIMBO
## 4623         MX001 Abarrotes 23/06/2020 17:47:04                           JOYA
## 4624         MX001 Abarrotes 28/06/2020 22:33:27                          PEPSI
## 4625         MX001 Abarrotes 23/06/2020 17:47:23                        KINDER 
## 4626         MX001 Abarrotes 28/06/2020 22:34:06                          BOING
## 4627         MX001 Abarrotes 23/06/2020 17:47:43                          PEPSI
## 4628         MX001 Abarrotes 28/06/2020 22:34:06                          PEPSI
## 4629         MX001 Abarrotes 23/06/2020 17:49:17                       MARLBORO
## 4630         MX001 Abarrotes 28/06/2020 22:35:45                          PEPSI
## 4631         MX001 Abarrotes 28/06/2020 22:35:45                    ELECTROPURA
## 4632         MX001 Abarrotes 28/06/2020 22:35:45                          AXION
## 4633         MX001 Abarrotes 23/06/2020 17:50:56                         ACT II
## 4634         MX001 Abarrotes 28/06/2020 22:42:03                         CHIMEX
## 4635         MX001 Abarrotes 28/06/2020 22:42:03                          PEPSI
## 4636         MX001 Abarrotes 28/06/2020 22:47:37                     TOPO CHICO
## 4637         MX001 Abarrotes 28/06/2020 22:47:37                         FRESCA
## 4638         MX001 Abarrotes 28/06/2020 22:47:37                COCA COLA LIGHT
## 4639         MX001 Abarrotes 23/06/2020 18:00:51                      COCA COLA
## 4640         MX001 Abarrotes 23/06/2020 18:01:31                       DANONINO
## 4641         MX001 Abarrotes 28/06/2020 22:54:16                          BIMBO
## 4642         MX001 Abarrotes 28/06/2020 22:54:16                       KOLALOKA
## 4643         MX001 Abarrotes 28/06/2020 23:01:19                        YOPLAIT
## 4644         MX001 Abarrotes 23/06/2020 18:04:57                      PALL MALL
## 4645         MX001 Abarrotes 28/06/2020 23:04:27                           TUNY
## 4646         MX001 Abarrotes 23/06/2020 18:06:09                          PEPSI
## 4647         MX001 Abarrotes 23/06/2020 18:06:31                         VELVET
## 4648         MX001 Abarrotes 23/06/2020 18:07:19                           TANG
## 4649         MX001 Abarrotes 28/06/2020 23:10:57                         TECATE
## 4650         MX001 Abarrotes 23/06/2020 18:12:21                    ELECTROPURA
## 4651         MX001 Abarrotes 23/06/2020 18:12:21                            FUD
## 4652         MX001 Abarrotes 28/06/2020 23:12:25                       MARLBORO
## 4653         MX001 Abarrotes 23/06/2020 18:13:57                        MASSISO
## 4654         MX001 Abarrotes 28/06/2020 23:46:25                        DORITOS
## 4655         MX001 Abarrotes 28/06/2020 23:46:46                     TOPO CHICO
## 4656         MX001 Abarrotes 23/06/2020 18:16:51                          PEPSI
## 4657         MX001 Abarrotes 23/06/2020 18:21:26                          BIMBO
## 4658         MX001 Abarrotes 23/06/2020 18:27:17                          DOWNY
## 4659         MX001 Abarrotes 28/06/2020 23:48:34                      COCA COLA
## 4660         MX001 Abarrotes 28/06/2020 23:50:29                           LINK
## 4661         MX001 Abarrotes 23/06/2020 18:28:27                          PEPSI
## 4662         MX001 Abarrotes 28/06/2020 23:51:02                       FABULOSO
## 4663         MX001 Abarrotes 28/06/2020 23:51:16                          BIMBO
## 4664         MX001 Abarrotes 28/06/2020 23:51:48                        CHEETOS
## 4665         MX001 Abarrotes 28/06/2020 23:51:48                        CHEETOS
## 4666         MX001 Abarrotes 28/06/2020 23:51:48                       SEVEN UP
## 4667         MX001 Abarrotes 23/06/2020 18:29:41                       GATORADE
## 4668         MX001 Abarrotes 28/06/2020 23:52:47                          PEPSI
## 4669         MX001 Abarrotes 28/06/2020 23:52:47                          EPURA
## 4670         MX001 Abarrotes 28/06/2020 23:53:12                      VALENTINA
## 4671         MX001 Abarrotes 23/06/2020 18:31:35                          PEPSI
## 4672         MX001 Abarrotes 28/06/2020 23:53:37                           NIDO
## 4673         MX001 Abarrotes 28/06/2020 23:58:02                    PEPSI LIGHT
## 4674         MX001 Abarrotes 23/06/2020 18:37:35                       TOSTITOS
## 4675         MX001 Abarrotes 28/06/2020 23:58:39                         ALWAYS
## 4676         MX001 Abarrotes 23/06/2020 18:38:11                      COCA COLA
## 4677         MX001 Abarrotes 28/06/2020 23:58:59                      COCA COLA
## 4678         MX001 Abarrotes 29/06/2020 00:01:46                      CORN POPS
## 4679         MX001 Abarrotes 23/06/2020 18:41:36                      COCA COLA
## 4680         MX001 Abarrotes 29/06/2020 00:01:46                           LALA
## 4681         MX001 Abarrotes 29/06/2020 00:02:27                       MARLBORO
## 4682         MX001 Abarrotes 23/06/2020 18:45:33                       BE-LIGHT
## 4683         MX001 Abarrotes 29/06/2020 00:04:48                      PALL MALL
## 4684         MX001 Abarrotes 29/06/2020 00:05:52                          BOING
## 4685         MX001 Abarrotes 29/06/2020 00:05:52                      DEL VALLE
## 4686         MX001 Abarrotes 23/06/2020 18:49:06                EL GALLO DE ORO
## 4687         MX001 Abarrotes 23/06/2020 18:49:06                        ISADORA
## 4688         MX001 Abarrotes 29/06/2020 00:06:06                          PEPSI
## 4689         MX001 Abarrotes 23/06/2020 18:51:35                        KINDER 
## 4690         MX001 Abarrotes 29/06/2020 00:06:46                        DORITOS
## 4691         MX001 Abarrotes 29/06/2020 00:06:46                        YOPLAIT
## 4692         MX001 Abarrotes 29/06/2020 00:06:46                      DEL VALLE
## 4693         MX001 Abarrotes 23/06/2020 18:52:47                        CHEETOS
## 4694         MX001 Abarrotes 23/06/2020 18:53:22                      COCA COLA
## 4695         MX001 Abarrotes 29/06/2020 00:08:35                         TECATE
## 4696         MX001 Abarrotes 29/06/2020 00:10:10                           LALA
## 4697         MX001 Abarrotes 29/06/2020 00:10:10                          BIMBO
## 4698         MX001 Abarrotes 23/06/2020 18:55:09                      COCA COLA
## 4699         MX001 Abarrotes 23/06/2020 18:59:54                      COCA COLA
## 4700         MX001 Abarrotes 23/06/2020 18:59:54                     HELLMANN´S
## 4701         MX001 Abarrotes 29/06/2020 00:12:44                           TANG
## 4702         MX001 Abarrotes 29/06/2020 00:12:44                           TANG
## 4703         MX001 Abarrotes 23/06/2020 19:03:17                      NORTEÑITA
## 4704         MX001 Abarrotes 29/06/2020 00:15:19                            M&M
## 4705         MX001 Abarrotes 23/06/2020 19:05:20                       SABRITAS
## 4706         MX001 Abarrotes 29/06/2020 00:15:35                  MANZANITA SOL
## 4707         MX001 Abarrotes 29/06/2020 00:16:15                          PEPSI
## 4708         MX001 Abarrotes 29/06/2020 00:16:45                      COCA COLA
## 4709         MX001 Abarrotes 29/06/2020 00:16:45                           LALA
## 4710         MX001 Abarrotes 23/06/2020 19:08:56                          KNORR
## 4711         MX001 Abarrotes 23/06/2020 19:08:56                          PEPSI
## 4712         MX001 Abarrotes 29/06/2020 00:17:56                         TECATE
## 4713         MX001 Abarrotes 23/06/2020 19:10:05                        RUFFLES
## 4714         MX001 Abarrotes 23/06/2020 19:10:05                        CHEETOS
## 4715         MX001 Abarrotes 23/06/2020 19:10:05                EL GALLO DE ORO
## 4716         MX001 Abarrotes 29/06/2020 00:19:06                       MARUCHAN
## 4717         MX001 Abarrotes 29/06/2020 00:19:06                     LA COSTEÑA
## 4718         MX001 Abarrotes 23/06/2020 19:10:47                        NORTEÑO
## 4719         MX001 Abarrotes 23/06/2020 19:11:59                          PEPSI
## 4720         MX001 Abarrotes 23/06/2020 19:12:26                       MARUCHAN
## 4721         MX001 Abarrotes 29/06/2020 00:20:52                          BEBIN
## 4722         MX001 Abarrotes 23/06/2020 19:13:11                     DOÑA MARIA
## 4723         MX001 Abarrotes 23/06/2020 19:13:11                           TANG
## 4724         MX001 Abarrotes 23/06/2020 19:14:27                    5 ESTRELLAS
## 4725         MX001 Abarrotes 23/06/2020 19:15:15                      NORTEÑITA
## 4726         MX001 Abarrotes 23/06/2020 19:16:26                       MARINELA
## 4727         MX001 Abarrotes 29/06/2020 09:42:04                CREMAX DE NIEVE
## 4728         MX001 Abarrotes 29/06/2020 09:42:04                         DAN UP
## 4729         MX001 Abarrotes 23/06/2020 19:18:04                VELADORA MEXICO
## 4730         MX001 Abarrotes 29/06/2020 09:43:05                         DANONE
## 4731         MX001 Abarrotes 29/06/2020 09:43:55                          BIMBO
## 4732         MX001 Abarrotes 29/06/2020 09:43:55                    NUTRI LECHE
## 4733         MX001 Abarrotes 29/06/2020 09:43:55                        MONARCA
## 4734         MX001 Abarrotes 23/06/2020 19:18:51                         NORVER
## 4735         MX001 Abarrotes 23/06/2020 19:20:19                           ZOTE
## 4736         MX001 Abarrotes 23/06/2020 19:20:19                          BIMBO
## 4737         MX001 Abarrotes 23/06/2020 19:20:19                       COLGATE 
## 4738         MX001 Abarrotes 23/06/2020 19:22:57             SALADITAS (GAMESA)
## 4739         MX001 Abarrotes 29/06/2020 09:48:21                          PEPSI
## 4740         MX001 Abarrotes 23/06/2020 19:22:57                       POWERADE
## 4741         MX001 Abarrotes 23/06/2020 19:22:57                           JOYA
## 4742         MX001 Abarrotes 29/06/2020 09:51:56                       CLORALEX
## 4743         MX001 Abarrotes 29/06/2020 09:53:02                      COCA COLA
## 4744         MX001 Abarrotes 29/06/2020 09:59:40                         SQUIRT
## 4745         MX001 Abarrotes 29/06/2020 10:01:44                         MASECA
## 4746         MX001 Abarrotes 23/06/2020 19:28:44                           TANG
## 4747         MX001 Abarrotes 23/06/2020 19:28:44                           TANG
## 4748         MX001 Abarrotes 29/06/2020 10:05:28                           OBAO
## 4749         MX001 Abarrotes 23/06/2020 19:29:03                      COCA COLA
## 4750         MX001 Abarrotes 29/06/2020 10:09:19                      DEL VALLE
## 4751         MX001 Abarrotes 29/06/2020 10:10:46                          PEPSI
## 4752         MX001 Abarrotes 23/06/2020 19:29:52                      COCA COLA
## 4753         MX001 Abarrotes 23/06/2020 19:31:55             SALADITAS (GAMESA)
## 4754         MX001 Abarrotes 29/06/2020 10:16:05                          PEPSI
## 4755         MX001 Abarrotes 23/06/2020 19:33:21                          BIMBO
## 4756         MX001 Abarrotes 29/06/2020 10:23:28                  FIOR DI PASTA
## 4757         MX001 Abarrotes 29/06/2020 10:23:28                          BIMBO
## 4758         MX001 Abarrotes 29/06/2020 10:23:28                     VALLE FRUT
## 4759         MX001 Abarrotes 29/06/2020 10:23:28                      COCA COLA
## 4760         MX001 Abarrotes 29/06/2020 10:24:15                      CONSOMATE
## 4761         MX001 Abarrotes 29/06/2020 10:31:05                          BIMBO
## 4762         MX001 Abarrotes 23/06/2020 19:34:43             SALADITAS (GAMESA)
## 4763         MX001 Abarrotes 23/06/2020 19:34:43                          PEPSI
## 4764         MX001 Abarrotes 29/06/2020 10:31:05                       BONAFONT
## 4765         MX001 Abarrotes 29/06/2020 10:36:57                          BIMBO
## 4766         MX001 Abarrotes 23/06/2020 19:35:03                          PEPSI
## 4767         MX001 Abarrotes 29/06/2020 10:36:57                           TANG
## 4768         MX001 Abarrotes 23/06/2020 19:37:29                     VALLE FRUT
## 4769         MX001 Abarrotes 29/06/2020 10:42:30                           LINK
## 4770         MX001 Abarrotes 23/06/2020 19:37:29                           LINK
## 4771         MX001 Abarrotes 23/06/2020 19:37:49                          BIMBO
## 4772         MX001 Abarrotes 23/06/2020 19:38:50                          KNORR
## 4773         MX001 Abarrotes 29/06/2020 10:44:42                         GAMESA
## 4774         MX001 Abarrotes 29/06/2020 10:44:42                        NESCAFE
## 4775         MX001 Abarrotes 29/06/2020 10:44:42                           LALA
## 4776         MX001 Abarrotes 23/06/2020 19:41:31                      COCA COLA
## 4777         MX001 Abarrotes 29/06/2020 10:45:49                       BIG COLA
## 4778         MX001 Abarrotes 29/06/2020 10:49:11                           TANG
## 4779         MX001 Abarrotes 29/06/2020 11:23:20                           TANG
## 4780         MX001 Abarrotes 29/06/2020 11:24:32                        LA FINA
## 4781         MX001 Abarrotes 29/06/2020 11:28:21                           LINK
## 4782         MX001 Abarrotes 29/06/2020 11:29:59                         SQUIRT
## 4783         MX001 Abarrotes 29/06/2020 11:33:23                      COCA COLA
## 4784         MX001 Abarrotes 23/06/2020 19:48:31                      COCA COLA
## 4785         MX001 Abarrotes 23/06/2020 19:49:40                    RANCH STYLE
## 4786         MX001 Abarrotes 29/06/2020 11:34:38                          PEPSI
## 4787         MX001 Abarrotes 29/06/2020 11:36:04                        BOKADOS
## 4788         MX001 Abarrotes 29/06/2020 11:36:04                           JOYA
## 4789         MX001 Abarrotes 29/06/2020 11:36:04                          FANTA
## 4790         MX001 Abarrotes 29/06/2020 11:36:51                    LA BOTANERA
## 4791         MX001 Abarrotes 23/06/2020 19:50:25                        NESCAFE
## 4792         MX001 Abarrotes 29/06/2020 11:37:41                           FOCA
## 4793         MX001 Abarrotes 23/06/2020 19:50:48                          PEPSI
## 4794         MX001 Abarrotes 29/06/2020 11:38:57                        MIRINDA
## 4795         MX001 Abarrotes 23/06/2020 19:52:45                      CONSOMATE
## 4796         MX001 Abarrotes 29/06/2020 11:39:17                         ALWAYS
## 4797         MX001 Abarrotes 23/06/2020 19:53:13                        KINDER 
## 4798         MX001 Abarrotes 29/06/2020 11:40:23                       CLORALEX
## 4799         MX001 Abarrotes 29/06/2020 11:41:05                         TECATE
## 4800         MX001 Abarrotes 23/06/2020 19:55:08                        DORITOS
## 4801         MX001 Abarrotes 23/06/2020 19:55:08                          PEPSI
## 4802         MX001 Abarrotes 29/06/2020 11:44:23                           LALA
## 4803         MX001 Abarrotes 23/06/2020 19:56:49                       MARUCHAN
## 4804         MX001 Abarrotes 29/06/2020 11:54:57                          PEPSI
## 4805         MX001 Abarrotes 29/06/2020 11:56:05                     TOPO CHICO
## 4806         MX001 Abarrotes 29/06/2020 11:56:05                          PEPSI
## 4807         MX001 Abarrotes 29/06/2020 11:56:05                COCA COLA LIGHT
## 4808         MX001 Abarrotes 23/06/2020 20:01:01                      COCA COLA
## 4809         MX001 Abarrotes 23/06/2020 20:01:01                           INCA
## 4810         MX001 Abarrotes 29/06/2020 11:58:32                       BONAFONT
## 4811         MX001 Abarrotes 29/06/2020 11:58:32                          PEPSI
## 4812         MX001 Abarrotes 23/06/2020 20:01:41                       CLORALEX
## 4813         MX001 Abarrotes 29/06/2020 12:01:05                           LINK
## 4814         MX001 Abarrotes 29/06/2020 12:03:13                    LA BOTANERA
## 4815         MX001 Abarrotes 29/06/2020 12:03:13                          BIMBO
## 4816         MX001 Abarrotes 29/06/2020 12:03:13                          PEPSI
## 4817         MX001 Abarrotes 29/06/2020 12:03:13                       DIAMANTE
## 4818         MX001 Abarrotes 29/06/2020 12:03:13                          KNORR
## 4819         MX001 Abarrotes 23/06/2020 20:02:40                      COCA COLA
## 4820         MX001 Abarrotes 23/06/2020 20:04:56                          MAMUT
## 4821         MX001 Abarrotes 29/06/2020 12:06:03                          BIMBO
## 4822         MX001 Abarrotes 23/06/2020 20:08:13                       BONAFONT
## 4823         MX001 Abarrotes 29/06/2020 12:06:29                      COCA COLA
## 4824         MX001 Abarrotes 23/06/2020 20:10:18                       POWERADE
## 4825         MX001 Abarrotes 23/06/2020 20:10:59                       MARLBORO
## 4826         MX001 Abarrotes 23/06/2020 20:11:21                           LINK
## 4827         MX001 Abarrotes 23/06/2020 20:14:12                      COCA COLA
## 4828         MX001 Abarrotes 29/06/2020 12:10:05                          FLASH
## 4829         MX001 Abarrotes 29/06/2020 12:15:10                      DEL VALLE
## 4830         MX001 Abarrotes 23/06/2020 20:18:21                     TOPO CHICO
## 4831         MX001 Abarrotes 23/06/2020 20:18:21                     CAMPBELL'S
## 4832         MX001 Abarrotes 23/06/2020 20:21:10                      PALL MALL
## 4833         MX001 Abarrotes 29/06/2020 12:18:05                      COCA COLA
## 4834         MX001 Abarrotes 29/06/2020 12:19:40                     BLUE HOUSE
## 4835         MX001 Abarrotes 29/06/2020 12:19:40                    MEDIA CREMA
## 4836         MX001 Abarrotes 23/06/2020 20:24:32                          PEPSI
## 4837         MX001 Abarrotes 29/06/2020 12:21:07                       JARRITOS
## 4838         MX001 Abarrotes 23/06/2020 20:24:32                       MARLBORO
## 4839         MX001 Abarrotes 23/06/2020 20:24:32                         SPRITE
## 4840         MX001 Abarrotes 29/06/2020 12:22:30                          BOING
## 4841         MX001 Abarrotes 29/06/2020 12:22:30                           GIRO
## 4842         MX001 Abarrotes 29/06/2020 12:22:30                       MARINELA
## 4843         MX001 Abarrotes 29/06/2020 12:22:30                           ROMA
## 4844         MX001 Abarrotes 29/06/2020 12:22:30                          KNORR
## 4845         MX001 Abarrotes 29/06/2020 12:22:30                      CONSOMATE
## 4846         MX001 Abarrotes 29/06/2020 12:22:55                      COCA COLA
## 4847         MX001 Abarrotes 23/06/2020 20:25:17                          PEPSI
## 4848         MX001 Abarrotes 29/06/2020 12:22:55                 COCA COLA ZERO
## 4849         MX001 Abarrotes 29/06/2020 12:23:10                          BIMBO
## 4850         MX001 Abarrotes 29/06/2020 12:23:39                          KRAFT
## 4851         MX001 Abarrotes 23/06/2020 20:26:40                     LA VILLITA
## 4852         MX001 Abarrotes 23/06/2020 20:27:16                      COCA COLA
## 4853         MX001 Abarrotes 23/06/2020 20:33:03                          PEPSI
## 4854         MX001 Abarrotes 29/06/2020 12:28:43                        DORITOS
## 4855         MX001 Abarrotes 29/06/2020 12:30:34             SALADITAS (GAMESA)
## 4856         MX001 Abarrotes 29/06/2020 12:30:34                      COCA COLA
## 4857         MX001 Abarrotes 29/06/2020 12:31:42                          BIMBO
## 4858         MX001 Abarrotes 29/06/2020 12:31:42                          BIMBO
## 4859         MX001 Abarrotes 29/06/2020 12:33:02                          PEPSI
## 4860         MX001 Abarrotes 23/06/2020 20:36:04                          PEPSI
## 4861         MX001 Abarrotes 23/06/2020 20:36:04                           TANG
## 4862         MX001 Abarrotes 23/06/2020 20:37:05                        CHEETOS
## 4863         MX001 Abarrotes 29/06/2020 12:39:54               CLEMENTE JACQUES
## 4864         MX001 Abarrotes 23/06/2020 20:38:30                           BIDA
## 4865         MX001 Abarrotes 23/06/2020 20:38:30                      COCA COLA
## 4866         MX001 Abarrotes 23/06/2020 20:38:30                            M&M
## 4867         MX001 Abarrotes 23/06/2020 20:38:30                        KINDER 
## 4868         MX001 Abarrotes 29/06/2020 12:44:32                       PEDIGREE
## 4869         MX001 Abarrotes 29/06/2020 12:47:11                      COCA COLA
## 4870         MX001 Abarrotes 23/06/2020 20:45:04                      COCA COLA
## 4871         MX001 Abarrotes 23/06/2020 20:45:47                        ENCANTO
## 4872         MX001 Abarrotes 29/06/2020 12:54:52                          PEPSI
## 4873         MX001 Abarrotes 29/06/2020 12:55:56                          PEPSI
## 4874         MX001 Abarrotes 23/06/2020 20:46:13                      COCA COLA
## 4875         MX001 Abarrotes 23/06/2020 20:48:33                          BIMBO
## 4876         MX001 Abarrotes 29/06/2020 12:58:56                      CONSOMATE
## 4877         MX001 Abarrotes 29/06/2020 13:00:20                      COCA COLA
## 4878         MX001 Abarrotes 29/06/2020 13:00:20                          SALVO
## 4879         MX001 Abarrotes 29/06/2020 13:02:52                            MAS
## 4880         MX001 Abarrotes 29/06/2020 13:02:52                        KINDER 
## 4881         MX001 Abarrotes 23/06/2020 20:56:46                      COCA COLA
## 4882         MX001 Abarrotes 29/06/2020 13:17:33                     CALIFORNIA
## 4883         MX001 Abarrotes 29/06/2020 13:17:33                       JARRITOS
## 4884         MX001 Abarrotes 29/06/2020 13:18:41                       SABRITAS
## 4885         MX001 Abarrotes 29/06/2020 13:18:41                          JUMEX
## 4886         MX001 Abarrotes 23/06/2020 20:57:59                           TANG
## 4887         MX001 Abarrotes 23/06/2020 20:59:28                      COCA COLA
## 4888         MX001 Abarrotes 23/06/2020 20:59:28                          PEPSI
## 4889         MX001 Abarrotes 29/06/2020 13:26:18                       SABRITAS
## 4890         MX001 Abarrotes 29/06/2020 13:26:52                          PEPSI
## 4891         MX001 Abarrotes 29/06/2020 13:30:49                          BIMBO
## 4892         MX001 Abarrotes 29/06/2020 13:31:39                          PEPSI
## 4893         MX001 Abarrotes 23/06/2020 21:04:50                           JOYA
## 4894         MX001 Abarrotes 23/06/2020 21:06:10                      COCA COLA
## 4895         MX001 Abarrotes 29/06/2020 13:32:18                        CHEETOS
## 4896         MX001 Abarrotes 23/06/2020 21:06:10                      COCA COLA
## 4897         MX001 Abarrotes 23/06/2020 21:06:10                        CAMELIA
## 4898         MX001 Abarrotes 23/06/2020 21:07:17                           LALA
## 4899         MX001 Abarrotes 29/06/2020 13:33:41                         JALOMA
## 4900         MX001 Abarrotes 23/06/2020 21:07:17                      COCA COLA
## 4901         MX001 Abarrotes 29/06/2020 13:37:47                          BIMBO
## 4902         MX001 Abarrotes 23/06/2020 21:11:07                          PEPSI
## 4903         MX001 Abarrotes 29/06/2020 13:43:39                           LALA
## 4904         MX001 Abarrotes 29/06/2020 13:43:39                          FLAMA
## 4905         MX001 Abarrotes 23/06/2020 21:13:18                      COCA COLA
## 4906         MX001 Abarrotes 29/06/2020 13:43:57                       SUAVITEL
## 4907         MX001 Abarrotes 29/06/2020 13:45:57                      CONSOMATE
## 4908         MX001 Abarrotes 29/06/2020 13:47:37                          PEPSI
## 4909         MX001 Abarrotes 23/06/2020 21:14:59                          EPURA
## 4910         MX001 Abarrotes 23/06/2020 21:15:14                       POWERADE
## 4911         MX001 Abarrotes 29/06/2020 13:48:53                          JUMEX
## 4912         MX001 Abarrotes 29/06/2020 13:48:53                           LALA
## 4913         MX001 Abarrotes 23/06/2020 21:16:22                          PEPSI
## 4914         MX001 Abarrotes 29/06/2020 13:48:53                          PEPSI
## 4915         MX001 Abarrotes 29/06/2020 13:48:53                          ELITE
## 4916         MX001 Abarrotes 29/06/2020 13:48:53                       COLGATE 
## 4917         MX001 Abarrotes 29/06/2020 13:48:53                        ISADORA
## 4918         MX001 Abarrotes 29/06/2020 13:49:41                          FLASH
## 4919         MX001 Abarrotes 29/06/2020 13:49:41                          PEPSI
## 4920         MX001 Abarrotes 29/06/2020 13:49:41                           ZOTE
## 4921         MX001 Abarrotes 23/06/2020 21:18:39                      COCA COLA
## 4922         MX001 Abarrotes 29/06/2020 13:52:35                          ARIEL
## 4923         MX001 Abarrotes 23/06/2020 21:19:07                     LA VILLITA
## 4924         MX001 Abarrotes 29/06/2020 13:53:05             SALADITAS (GAMESA)
## 4925         MX001 Abarrotes 23/06/2020 21:19:20                    NUTRI LECHE
## 4926         MX001 Abarrotes 23/06/2020 21:19:54                           LALA
## 4927         MX001 Abarrotes 23/06/2020 21:19:54                     VALLE FRUT
## 4928         MX001 Abarrotes 23/06/2020 21:19:54                          EPURA
## 4929         MX001 Abarrotes 29/06/2020 13:54:13                          PEPSI
## 4930         MX001 Abarrotes 23/06/2020 21:24:13                      COCA COLA
## 4931         MX001 Abarrotes 29/06/2020 13:55:25                          AXION
## 4932         MX001 Abarrotes 23/06/2020 21:25:55                          BIMBO
## 4933         MX001 Abarrotes 29/06/2020 14:11:00                         GERBER
## 4934         MX001 Abarrotes 29/06/2020 14:11:00                         GERBER
## 4935         MX001 Abarrotes 23/06/2020 21:27:27                         NUGGET
## 4936         MX001 Abarrotes 29/06/2020 14:11:00                         DAN UP
## 4937         MX001 Abarrotes 23/06/2020 21:27:53                         DAN UP
## 4938         MX001 Abarrotes 23/06/2020 21:29:04                       MARLBORO
## 4939         MX001 Abarrotes 29/06/2020 14:23:49                          BIMBO
## 4940         MX001 Abarrotes 29/06/2020 14:57:52                   BUBBA XTREME
## 4941         MX001 Abarrotes 29/06/2020 14:57:52                         DAN UP
## 4942         MX001 Abarrotes 23/06/2020 21:32:11                          PEPSI
## 4943         MX001 Abarrotes 29/06/2020 15:32:49                      DEL VALLE
## 4944         MX001 Abarrotes 23/06/2020 21:33:18                        CHEETOS
## 4945         MX001 Abarrotes 29/06/2020 15:36:44                          PEPSI
## 4946         MX001 Abarrotes 23/06/2020 21:34:21                          BIMBO
## 4947         MX001 Abarrotes 23/06/2020 21:34:21                          PEPSI
## 4948         MX001 Abarrotes 29/06/2020 15:39:54                        RUFFLES
## 4949         MX001 Abarrotes 29/06/2020 15:39:54                         TECATE
## 4950         MX001 Abarrotes 29/06/2020 15:43:02                          PEPSI
## 4951         MX001 Abarrotes 23/06/2020 21:39:15                      COCA COLA
## 4952         MX001 Abarrotes 23/06/2020 21:39:15                           LINK
## 4953         MX001 Abarrotes 29/06/2020 15:44:31                      COCA COLA
## 4954         MX001 Abarrotes 29/06/2020 15:49:28                          PEPSI
## 4955         MX001 Abarrotes 23/06/2020 21:44:04                     HELLMANN´S
## 4956         MX001 Abarrotes 23/06/2020 21:44:04                          BIMBO
## 4957         MX001 Abarrotes 23/06/2020 21:44:04                      COCA COLA
## 4958         MX001 Abarrotes 29/06/2020 16:06:07                         NUGGET
## 4959         MX001 Abarrotes 23/06/2020 21:47:24                          EPURA
## 4960         MX001 Abarrotes 29/06/2020 16:22:56                       TOSTILEO
## 4961         MX001 Abarrotes 29/06/2020 16:22:56                       PEDIGREE
## 4962         MX001 Abarrotes 29/06/2020 16:22:56                          BIMBO
## 4963         MX001 Abarrotes 29/06/2020 16:22:56                          BIMBO
## 4964         MX001 Abarrotes 29/06/2020 16:22:56                       JARRITOS
## 4965         MX001 Abarrotes 29/06/2020 16:25:33                          PEPSI
## 4966         MX001 Abarrotes 29/06/2020 16:25:33                     BLUE HOUSE
## 4967         MX001 Abarrotes 29/06/2020 16:25:33                           JOYA
## 4968         MX001 Abarrotes 23/06/2020 21:51:10                     SABRITONES
## 4969         MX001 Abarrotes 29/06/2020 16:26:58                           FOCA
## 4970         MX001 Abarrotes 23/06/2020 21:51:10                           LALA
## 4971         MX001 Abarrotes 23/06/2020 21:51:10                          FLAMA
## 4972         MX001 Abarrotes 29/06/2020 16:26:58                          SALVO
## 4973         MX001 Abarrotes 29/06/2020 16:26:58                       LA PERLA
## 4974         MX001 Abarrotes 29/06/2020 16:28:15             SALADITAS (GAMESA)
## 4975         MX001 Abarrotes 29/06/2020 16:28:15                          PEPSI
## 4976         MX001 Abarrotes 23/06/2020 21:53:15                 COCA COLA ZERO
## 4977         MX001 Abarrotes 29/06/2020 23:27:05                        RUFFLES
## 4978         MX001 Abarrotes 29/06/2020 23:27:05                         DAN UP
## 4979         MX001 Abarrotes 29/06/2020 23:27:40                      COCA COLA
## 4980         MX001 Abarrotes 29/06/2020 23:27:40                      KELLOGG'S
## 4981         MX001 Abarrotes 23/06/2020 22:00:59                           NIDO
## 4982         MX001 Abarrotes 29/06/2020 23:27:40              TRIDENT XTRA CARE
## 4983         MX001 Abarrotes 29/06/2020 23:27:59                        DORITOS
## 4984         MX001 Abarrotes 29/06/2020 23:27:59                        CHEETOS
## 4985         MX001 Abarrotes 29/06/2020 23:27:59                      COCA COLA
## 4986         MX001 Abarrotes 23/06/2020 22:02:15                      COCA COLA
## 4987         MX001 Abarrotes 29/06/2020 23:30:27                    ELECTROPURA
## 4988         MX001 Abarrotes 29/06/2020 23:30:27                    5 ESTRELLAS
## 4989         MX001 Abarrotes 23/06/2020 22:03:56                            ACE
## 4990         MX001 Abarrotes 29/06/2020 23:30:50                       PAKETAXO
## 4991         MX001 Abarrotes 29/06/2020 23:30:50                          PEPSI
## 4992         MX001 Abarrotes 23/06/2020 22:04:54                           LALA
## 4993         MX001 Abarrotes 29/06/2020 23:31:37                           LINK
## 4994         MX001 Abarrotes 23/06/2020 22:06:39                     CAPERUCITA
## 4995         MX001 Abarrotes 23/06/2020 22:06:39                          PEPSI
## 4996         MX001 Abarrotes 23/06/2020 22:06:39                        CAMELIA
## 4997         MX001 Abarrotes 29/06/2020 23:34:07                       JARRITOS
## 4998         MX001 Abarrotes 23/06/2020 22:07:31                          PEPSI
## 4999         MX001 Abarrotes 23/06/2020 22:08:07                COCA COLA LIGHT
##                                    Fabricante
## 1                                     MEXILAC
## 2                            DANONE DE MEXICO
## 3                                 GRUPO BIMBO
## 4                         PEPSI-COLA MEXICANA
## 5                  FABRICA DE JABON LA CORONA
## 6                                        ALEN
## 7                            DANONE DE MEXICO
## 8                  FABRICA DE JABON LA CORONA
## 9                    PROCTER & GAMBLE COMPANY
## 10                                      JUMEX
## 11                        PEPSI-COLA MEXICANA
## 12               JUGOS DEL VALLE S.A. DE C.V.
## 13                        PEPSI-COLA MEXICANA
## 14                                GRUPO BIMBO
## 15                      GRUPO INDUSTRIAL LALA
## 16                               GRUPO GAMESA
## 17                      GRUPO INDUSTRIAL LALA
## 18                   PROCTER & GAMBLE COMPANY
## 19                      GRUPO INDUSTRIAL LALA
## 20                                       ALEN
## 21                            SIGMA ALIMENTOS
## 22                                    MEXILAC
## 23               JUGOS DEL VALLE S.A. DE C.V.
## 24                                  COCA COLA
## 25                                GRUPO BIMBO
## 26                                  COCA COLA
## 27                                      JUMEX
## 28                                  COCA COLA
## 29                                    MEXILAC
## 30                            SIGMA ALIMENTOS
## 31                        PEPSI-COLA MEXICANA
## 32                                    MEXILAC
## 33                                GRUPO BIMBO
## 34                       GILLETTE MANUFACTURA
## 35                                  COCA COLA
## 36                                    MEXILAC
## 37                                  COCA COLA
## 38                                GRUPO BIMBO
## 39                                  COCA COLA
## 40                                  COCA COLA
## 41                                GRUPO BIMBO
## 42                 TOSTADAS Y BOTANAS PREMIUM
## 43                                  COCA COLA
## 44                                       ALEN
## 45                                  COCA COLA
## 46                            SIGMA ALIMENTOS
## 47                        PEPSI-COLA MEXICANA
## 48                          COLGATE PALMOLIVE
## 49                                  COCA COLA
## 50               JUGOS DEL VALLE S.A. DE C.V.
## 51                        PEPSI-COLA MEXICANA
## 52                                   SABRITAS
## 53                                   SABRITAS
## 54                                  COCA COLA
## 55                                    MEXILAC
## 56                        PEPSI-COLA MEXICANA
## 57                                  COCA COLA
## 58                            SIGMA ALIMENTOS
## 59                                   SABRITAS
## 60                                  COCA COLA
## 61                                  COCA COLA
## 62                        PEPSI-COLA MEXICANA
## 63                      GRUPO INDUSTRIAL LALA
## 64                        PEPSI-COLA MEXICANA
## 65                        PEPSI-COLA MEXICANA
## 66                                  COCA COLA
## 67                                  COCA COLA
## 68                 FABRICA DE JABON LA CORONA
## 69                                      JUMEX
## 70                                       ALEN
## 71                        PEPSI-COLA MEXICANA
## 72                                   SABRITAS
## 73                                    FERRERO
## 74                                  COCA COLA
## 75                                   QUALAMEX
## 76                   PROCTER & GAMBLE COMPANY
## 77                               GRUPO GAMESA
## 78                        PEPSI-COLA MEXICANA
## 79                                 EMPACADOS 
## 80                                  COCA COLA
## 81                        PEPSI-COLA MEXICANA
## 82                                   SABRITAS
## 83                        PEPSI-COLA MEXICANA
## 84                                   SABRITAS
## 85                                  COCA COLA
## 86                        INDUSTRIAS KOLALOKA
## 87                              CADBURY ADAMS
## 88                                  COCA COLA
## 89                                  COCA COLA
## 90                      GRUPO INDUSTRIAL LALA
## 91                                   LIQUIMEX
## 92                                   SABRITAS
## 93                        PEPSI-COLA MEXICANA
## 94                                  COCA COLA
## 95                            SIGMA ALIMENTOS
## 96                                   SABRITAS
## 97                               GRUPO GAMESA
## 98                        PEPSI-COLA MEXICANA
## 99                                       MARS
## 100              JUGOS DEL VALLE S.A. DE C.V.
## 101                                  SABRITAS
## 102                                 COCA COLA
## 103                                  SABRITAS
## 104                       PEPSI-COLA MEXICANA
## 105                                 COCA COLA
## 106                       PEPSI-COLA MEXICANA
## 107                                 COCA COLA
## 108                                  SABRITAS
## 109                FABRICA DE JABON LA CORONA
## 110                                 COCA COLA
## 111                                 COCA COLA
## 112                                  QUALAMEX
## 113                         RECKITT BENCHISER
## 114                       PEPSI-COLA MEXICANA
## 115                       PEPSI-COLA MEXICANA
## 116                             CADBURY ADAMS
## 117                            EFEM DE MEXICO
## 118                             CADBURY ADAMS
## 119                               GRUPO BIMBO
## 120                                      LINK
## 121              JUGOS DEL VALLE S.A. DE C.V.
## 122                       PEPSI-COLA MEXICANA
## 123                            EFEM DE MEXICO
## 124                TOSTADAS Y BOTANAS PREMIUM
## 125                        LAMBI S.A. DE C.V.
## 126                               GRUPO BIMBO
## 127                               GRUPO BIMBO
## 128                                  LIQUIMEX
## 129                                 COCA COLA
## 130                        LAMBI S.A. DE C.V.
## 131                          DANONE DE MEXICO
## 132                                  QUALAMEX
## 133                       PEPSI-COLA MEXICANA
## 134                                  SABRITAS
## 135                           SIGMA ALIMENTOS
## 136                       PEPSI-COLA MEXICANA
## 137                                  SABRITAS
## 138                               GRUPO BIMBO
## 139                                 COCA COLA
## 140                      CONAGRA FOODS MEXICO
## 141                       PEPSI-COLA MEXICANA
## 142                           VELADORA MEXICO
## 143                       PEPSI-COLA MEXICANA
## 144                       PEPSI-COLA MEXICANA
## 145                                 COCA COLA
## 146                 CONVERTIDORA DE PLASTICOS
## 147                      ALIMENTOS DEL FUERTE
## 148                                  SABRITAS
## 149                              GRUPO GAMESA
## 150                       PEPSI-COLA MEXICANA
## 151               FABRICA DE JABON LA REINERA
## 152                                   MEXILAC
## 153                                  SABRITAS
## 154                                  SABRITAS
## 155                                 COCA COLA
## 156                                      ALEN
## 157                                 COCA COLA
## 158                               GRUPO BIMBO
## 159                       PEPSI-COLA MEXICANA
## 160                       PEPSI-COLA MEXICANA
## 161                                  SABRITAS
## 162                       PEPSI-COLA MEXICANA
## 163                                 COCA COLA
## 164                                 COCA COLA
## 165                               GRUPO BIMBO
## 166                                 COCA COLA
## 167                       PEPSI-COLA MEXICANA
## 168                     GRUPO INDUSTRIAL LALA
## 169                       PEPSI-COLA MEXICANA
## 170                FABRICA DE JABON LA CORONA
## 171                          PRODUCTOS CIERVO
## 172                               GRUPO BIMBO
## 173                                 COCA COLA
## 174                           SIGMA ALIMENTOS
## 175                                  SABRITAS
## 176                                 COCA COLA
## 177                       PEPSI-COLA MEXICANA
## 178                                  SABRITAS
## 179                                  SABRITAS
## 180                        UNILEVER DE MEXICO
## 181                         COLGATE PALMOLIVE
## 182                                  SABRITAS
## 183                FABRICA DE JABON LA CORONA
## 184              JUGOS DEL VALLE S.A. DE C.V.
## 185                                 COCA COLA
## 186                                      LINK
## 187                                  SABRITAS
## 188                               GRUPO BIMBO
## 189                               GRUPO BIMBO
## 190                               GRUPO BIMBO
## 191                               GRUPO BIMBO
## 192                                  SABRITAS
## 193          NACIONAL  DE ALIMENTOS Y HELADOS
## 194                       PEPSI-COLA MEXICANA
## 195                                  SABRITAS
## 196                       PEPSI-COLA MEXICANA
## 197                               KRAFT FOODS
## 198                       PEPSI-COLA MEXICANA
## 199                    COMERCIALIZADORA GOMEZ
## 200          NACIONAL  DE ALIMENTOS Y HELADOS
## 201                              GRUPO GAMESA
## 202          NACIONAL  DE ALIMENTOS Y HELADOS
## 203                                  SABRITAS
## 204                                  SABRITAS
## 205                       PEPSI-COLA MEXICANA
## 206                 CONVERTIDORA DE PLASTICOS
## 207                 CONVERTIDORA DE PLASTICOS
## 208                               GRUPO BIMBO
## 209                           SIGMA ALIMENTOS
## 210                                 COCA COLA
## 211                          DANONE DE MEXICO
## 212                                  SABRITAS
## 213                            HERSHEY MEXICO
## 214                          DANONE DE MEXICO
## 215                                  SABRITAS
## 216                                  SABRITAS
## 217                                  SABRITAS
## 218                       PEPSI-COLA MEXICANA
## 219                                  SABRITAS
## 220                       PEPSI-COLA MEXICANA
## 221                                  SABRITAS
## 222                                 COCA COLA
## 223                       PEPSI-COLA MEXICANA
## 224                              AJEMONTERREY
## 225                      CAMPBELL'S DE MEXICO
## 226                                   SONRICS
## 227                       PEPSI-COLA MEXICANA
## 228                                      LINK
## 229                                 COCA COLA
## 230                                 COCA COLA
## 231                                 COCA COLA
## 232                                 COCA COLA
## 233                               GRUPO BIMBO
## 234                       PEPSI-COLA MEXICANA
## 235                      BRISTOL-MYERS SQUIBB
## 236                                  SABRITAS
## 237                 BOTANAS LEO, S.A. DE C.V.
## 238                                  SABRITAS
## 239                       PEPSI-COLA MEXICANA
## 240                FABRICA DE JABON LA CORONA
## 241                         COLGATE PALMOLIVE
## 242                               GRUPO BIMBO
## 243                                      ALEN
## 244                                    BARCEL
## 245                                    NESTLE
## 246                       PEPSI-COLA MEXICANA
## 247              JUGOS DEL VALLE S.A. DE C.V.
## 248                       PEPSI-COLA MEXICANA
## 249                                   CIGATAM
## 250                     GRUPO INDUSTRIAL LALA
## 251                       PEPSI-COLA MEXICANA
## 252                        LABORATORIO MONELI
## 253                                 COCA COLA
## 254                     GRUPO INDUSTRIAL LALA
## 255                          DANONE DE MEXICO
## 256                                    NEVADA
## 257                                  SABRITAS
## 258                                      ALEN
## 259                                 COCA COLA
## 260                       PEPSI-COLA MEXICANA
## 261                                   CIGATAM
## 262                  PROCTER & GAMBLE COMPANY
## 263                                  SABRITAS
## 264                                      ALEN
## 265          NACIONAL  DE ALIMENTOS Y HELADOS
## 266                         COLGATE PALMOLIVE
## 267              JUGOS DEL VALLE S.A. DE C.V.
## 268                                  SABRITAS
## 269                                 COCA COLA
## 270                                  SABRITAS
## 271                             CADBURY ADAMS
## 272                                 COCA COLA
## 273                                   FERRERO
## 274                                 COCA COLA
## 275                     S. C. JOHNSON AND SON
## 276              JUGOS DEL VALLE S.A. DE C.V.
## 277                                  SABRITAS
## 278                           SIGMA ALIMENTOS
## 279                           SIGMA ALIMENTOS
## 280                               GRUPO BIMBO
## 281                     GRUPO INDUSTRIAL LALA
## 282                               GRUPO BIMBO
## 283                                      ALEN
## 284                                  SABRITAS
## 285                                   CIGATAM
## 286                               GRUPO BIMBO
## 287                                 COCA COLA
## 288                                 COCA COLA
## 289                     GRUPO INDUSTRIAL LALA
## 290                                KLEEN BEBE
## 291                       PEPSI-COLA MEXICANA
## 292                       PEPSI-COLA MEXICANA
## 293                                  SABRITAS
## 294                       PEPSI-COLA MEXICANA
## 295                                  SABRITAS
## 296                                  SABRITAS
## 297                       PEPSI-COLA MEXICANA
## 298                           VELADORA MEXICO
## 299                                      ALEN
## 300                         COLGATE PALMOLIVE
## 301              JUGOS DEL VALLE S.A. DE C.V.
## 302                               GRUPO BIMBO
## 303                               GRUPO BIMBO
## 304                                  SABRITAS
## 305                                      ALEN
## 306                                   CIGATAM
## 307                       PEPSI-COLA MEXICANA
## 308                       PEPSI-COLA MEXICANA
## 309                                   CIGATAM
## 310                                 COCA COLA
## 311                                 COCA COLA
## 312                       PEPSI-COLA MEXICANA
## 313                                  SABRITAS
## 314                     GRUPO INDUSTRIAL LALA
## 315                       PEPSI-COLA MEXICANA
## 316                                  SABRITAS
## 317                                  SABRITAS
## 318                       PEPSI-COLA MEXICANA
## 319                               GRUPO BIMBO
## 320                       PEPSI-COLA MEXICANA
## 321                               GRUPO BIMBO
## 322                               GRUPO BIMBO
## 323                FABRICA DE JABON LA CORONA
## 324                               GRUPO BIMBO
## 325                                 COCA COLA
## 326                                 COCA COLA
## 327                       PEPSI-COLA MEXICANA
## 328                                      LINK
## 329                                  SABRITAS
## 330                                  SABRITAS
## 331                                  SABRITAS
## 332                     GRUPO INDUSTRIAL LALA
## 333                                 COCA COLA
## 334                       PEPSI-COLA MEXICANA
## 335                       PEPSI-COLA MEXICANA
## 336                       PEPSI-COLA MEXICANA
## 337                       PEPSI-COLA MEXICANA
## 338                          DANONE DE MEXICO
## 339                                  SABRITAS
## 340                                  SABRITAS
## 341                     GRUPO INDUSTRIAL LALA
## 342                                  SABRITAS
## 343                       PEPSI-COLA MEXICANA
## 344                  PROCTER & GAMBLE COMPANY
## 345                               GRUPO BIMBO
## 346                               GRUPO BIMBO
## 347                       PEPSI-COLA MEXICANA
## 348  FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 349                                 COCA COLA
## 350                               GRUPO BIMBO
## 351              JUGOS DEL VALLE S.A. DE C.V.
## 352              JUGOS DEL VALLE S.A. DE C.V.
## 353                                 COCA COLA
## 354                       PEPSI-COLA MEXICANA
## 355                FABRICA DE JABON LA CORONA
## 356                                  SABRITAS
## 357                       PEPSI-COLA MEXICANA
## 358                         COLGATE PALMOLIVE
## 359          NACIONAL  DE ALIMENTOS Y HELADOS
## 360          NACIONAL  DE ALIMENTOS Y HELADOS
## 361                                 COCA COLA
## 362                       PEPSI-COLA MEXICANA
## 363                                 COCA COLA
## 364                                 COCA COLA
## 365                       PEPSI-COLA MEXICANA
## 366                                 COCA COLA
## 367                  PROCTER & GAMBLE COMPANY
## 368        PRODUCTOS VERDE VALLE S.A. DE C.V.
## 369                                      ALEN
## 370                                      ALEN
## 371                       PEPSI-COLA MEXICANA
## 372                                    NEVADA
## 373                               GRUPO BIMBO
## 374                       PEPSI-COLA MEXICANA
## 375                                 COCA COLA
## 376                                     JUMEX
## 377                       PEPSI-COLA MEXICANA
## 378                                 COCA COLA
## 379                                 COCA COLA
## 380                     GRUPO INDUSTRIAL LALA
## 381                                    CORONA
## 382                  PROCTER & GAMBLE COMPANY
## 383                                     JUMEX
## 384              JUGOS DEL VALLE S.A. DE C.V.
## 385                           CIA. TOPO CHICO
## 386                               GRUPO BIMBO
## 387                          DANONE DE MEXICO
## 388                                  SABRITAS
## 389                                  SABRITAS
## 390                       PEPSI-COLA MEXICANA
## 391                                 COCA COLA
## 392                       PEPSI-COLA MEXICANA
## 393                       PEPSI-COLA MEXICANA
## 394                       PEPSI-COLA MEXICANA
## 395                       PEPSI-COLA MEXICANA
## 396                       PEPSI-COLA MEXICANA
## 397                       PEPSI-COLA MEXICANA
## 398                                  SABRITAS
## 399                                      ALEN
## 400                                  SABRITAS
## 401                FABRICA DE JABON LA CORONA
## 402                                 COCA COLA
## 403                                 COCA COLA
## 404                     GRUPO INDUSTRIAL LALA
## 405  FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 406                                     JUMEX
## 407                  PROCTER & GAMBLE COMPANY
## 408                                  SABRITAS
## 409                                  SABRITAS
## 410                                  SABRITAS
## 411                                  SABRITAS
## 412                       PEPSI-COLA MEXICANA
## 413                                  SABRITAS
## 414              JUGOS DEL VALLE S.A. DE C.V.
## 415                               KRAFT FOODS
## 416                                     JUMEX
## 417                                      LINK
## 418                 CONVERTIDORA DE PLASTICOS
## 419                        UNILEVER DE MEXICO
## 420                 BOTANAS LEO, S.A. DE C.V.
## 421                           MONROE CHEMICAL
## 422                           MONROE CHEMICAL
## 423                                      ALEN
## 424                               GRUPO BIMBO
## 425                                 COCA COLA
## 426                               KRAFT FOODS
## 427                               KRAFT FOODS
## 428                                 COCA COLA
## 429                                  SABRITAS
## 430                        UNILEVER DE MEXICO
## 431                       PEPSI-COLA MEXICANA
## 432                                 COCA COLA
## 433                                 COCA COLA
## 434                       PEPSI-COLA MEXICANA
## 435                                 COCA COLA
## 436                                 COCA COLA
## 437                               KRAFT FOODS
## 438                                 COCA COLA
## 439          NACIONAL  DE ALIMENTOS Y HELADOS
## 440                                      ALEN
## 441                               GRUPO BIMBO
## 442                                 COCA COLA
## 443                               GRUPO BIMBO
## 444                       PEPSI-COLA MEXICANA
## 445              JUGOS DEL VALLE S.A. DE C.V.
## 446                       PEPSI-COLA MEXICANA
## 447                 BOTANAS LEO, S.A. DE C.V.
## 448                                 COCA COLA
## 449                               GRUPO BIMBO
## 450                                  SABRITAS
## 451                      GILLETTE MANUFACTURA
## 452                       PEPSI-COLA MEXICANA
## 453                       PEPSI-COLA MEXICANA
## 454                                 COCA COLA
## 455                                 COCA COLA
## 456                                EMPACADOS 
## 457                        UNILEVER DE MEXICO
## 458                                   FERRERO
## 459                                 COCA COLA
## 460                FABRICA DE JABON LA CORONA
## 461                               GRUPO BIMBO
## 462                FABRICA DE JABON LA CORONA
## 463                                 COCA COLA
## 464              JUGOS DEL VALLE S.A. DE C.V.
## 465                               GRUPO BIMBO
## 466                                 COCA COLA
## 467              JUGOS DEL VALLE S.A. DE C.V.
## 468                       PEPSI-COLA MEXICANA
## 469                       PEPSI-COLA MEXICANA
## 470                               KRAFT FOODS
## 471                       PEPSI-COLA MEXICANA
## 472                               KRAFT FOODS
## 473                               GRUPO BIMBO
## 474                       PEPSI-COLA MEXICANA
## 475              JUGOS DEL VALLE S.A. DE C.V.
## 476                                    NEVADA
## 477                                  SABRITAS
## 478                           CIA. TOPO CHICO
## 479                       PEPSI-COLA MEXICANA
## 480                       PEPSI-COLA MEXICANA
## 481                               GRUPO BIMBO
## 482                                  SABRITAS
## 483                       PEPSI-COLA MEXICANA
## 484                       PEPSI-COLA MEXICANA
## 485                            MOLINOS AZTECA
## 486                         ALIMENTOS CAPULLO
## 487                              GRUPO GAMESA
## 488                       PEPSI-COLA MEXICANA
## 489                              GRUPO GAMESA
## 490                              GRUPO GAMESA
## 491                FABRICA DE JABON LA CORONA
## 492                      CONAGRA FOODS MEXICO
## 493                              GRUPO GAMESA
## 494                                  SABRITAS
## 495                                   SONRICS
## 496                       PEPSI-COLA MEXICANA
## 497                      ALIMENTOS DEL FUERTE
## 498                       PEPSI-COLA MEXICANA
## 499                       PEPSI-COLA MEXICANA
## 500                                      ALEN
## 501                                      ALEN
## 502                              AJEMONTERREY
## 503                       PEPSI-COLA MEXICANA
## 504                       PEPSI-COLA MEXICANA
## 505                                 COCA COLA
## 506                       PEPSI-COLA MEXICANA
## 507                                 COCA COLA
## 508           CERVECERIA CUAUHTEMOC MOCTEZUMA
## 509                                   CIGATAM
## 510                                 COCA COLA
## 511                       PEPSI-COLA MEXICANA
## 512                                   FERRERO
## 513                         COLGATE PALMOLIVE
## 514                  PROCTER & GAMBLE COMPANY
## 515                                 COCA COLA
## 516                                      ALEN
## 517                           SIGMA ALIMENTOS
## 518                                      ALEN
## 519                                      ALEN
## 520                       PEPSI-COLA MEXICANA
## 521                                  SABRITAS
## 522                               GRUPO BIMBO
## 523                       PEPSI-COLA MEXICANA
## 524                       PEPSI-COLA MEXICANA
## 525                           SIGMA ALIMENTOS
## 526                       PEPSI-COLA MEXICANA
## 527                       PEPSI-COLA MEXICANA
## 528                                  SABRITAS
## 529                                  SABRITAS
## 530                       PEPSI-COLA MEXICANA
## 531                         FRABEL S.A DE C.V
## 532                               KRAFT FOODS
## 533                                   CIGATAM
## 534                       PEPSI-COLA MEXICANA
## 535                                 COCA COLA
## 536                       PEPSI-COLA MEXICANA
## 537                       PEPSI-COLA MEXICANA
## 538                                 COCA COLA
## 539              JUGOS DEL VALLE S.A. DE C.V.
## 540                       PEPSI-COLA MEXICANA
## 541                       PEPSI-COLA MEXICANA
## 542                                 COCA COLA
## 543                       PEPSI-COLA MEXICANA
## 544                       PEPSI-COLA MEXICANA
## 545                       PEPSI-COLA MEXICANA
## 546                               KRAFT FOODS
## 547                       PEPSI-COLA MEXICANA
## 548                                  SABRITAS
## 549                       PEPSI-COLA MEXICANA
## 550                       PEPSI-COLA MEXICANA
## 551                                 COCA COLA
## 552                       PEPSI-COLA MEXICANA
## 553                                   KURUMBA
## 554                 PESCADOS INDUSTRIALIZADOS
## 555                       PEPSI-COLA MEXICANA
## 556                 BOTANAS LEO, S.A. DE C.V.
## 557                              GRUPO GAMESA
## 558                               GRUPO BIMBO
## 559                                  SABRITAS
## 560                                  SABRITAS
## 561           CERVECERIA CUAUHTEMOC MOCTEZUMA
## 562                       PEPSI-COLA MEXICANA
## 563                      CONSERVAS LA COSTEÑA
## 564                                 COCA COLA
## 565                          DANONE DE MEXICO
## 566                       PEPSI-COLA MEXICANA
## 567                          DANONE DE MEXICO
## 568                                  SABRITAS
## 569                                 COCA COLA
## 570          NACIONAL  DE ALIMENTOS Y HELADOS
## 571                                   SONRICS
## 572                         EMPACADORA NORVER
## 573              JUGOS DEL VALLE S.A. DE C.V.
## 574                     GRUPO INDUSTRIAL LALA
## 575                           SIGMA ALIMENTOS
## 576                   Refrescos Pascual, S.A.
## 577                                 COCA COLA
## 578                                 COCA COLA
## 579                                      MARS
## 580                                 COCA COLA
## 581                     GRUPO INDUSTRIAL LALA
## 582                ACEITES GRASAS Y DERIVADOS
## 583                                  SABRITAS
## 584                                  SABRITAS
## 585                                  SABRITAS
## 586                               GRUPO BIMBO
## 587                               GRUPO BIMBO
## 588                                 COCA COLA
## 589                      GILLETTE MANUFACTURA
## 590                      GILLETTE MANUFACTURA
## 591                                 COCA COLA
## 592              JUGOS DEL VALLE S.A. DE C.V.
## 593                                  SABRITAS
## 594                                  SABRITAS
## 595                       PEPSI-COLA MEXICANA
## 596                              GRUPO GAMESA
## 597                     GRUPO INDUSTRIAL LALA
## 598                       PEPSI-COLA MEXICANA
## 599                                 COCA COLA
## 600                       PEPSI-COLA MEXICANA
## 601                                 COCA COLA
## 602                     GRUPO INDUSTRIAL LALA
## 603                       PEPSI-COLA MEXICANA
## 604                 CONVERTIDORA DE PLASTICOS
## 605                                    NESTLE
## 606                               GRUPO BIMBO
## 607                 BOTANAS LEO, S.A. DE C.V.
## 608                                   MEXILAC
## 609                FABRICA DE JABON LA CORONA
## 610                         PRODUCTOS PREMIER
## 611                         COLGATE PALMOLIVE
## 612                         COLGATE PALMOLIVE
## 613                               SPEED STICK
## 614                         COLGATE PALMOLIVE
## 615                    ESTHER CAMACHO GARNICA
## 616          NACIONAL  DE ALIMENTOS Y HELADOS
## 617          NACIONAL  DE ALIMENTOS Y HELADOS
## 618                       PEPSI-COLA MEXICANA
## 619                      CONSERVAS LA COSTEÑA
## 620                       PEPSI-COLA MEXICANA
## 621                              GRUPO GAMESA
## 622                                 COCA COLA
## 623                     GRUPO INDUSTRIAL LALA
## 624                       PEPSI-COLA MEXICANA
## 625                               KRAFT FOODS
## 626                        GOMEZ CUETARA HNOS
## 627                    ESTHER CAMACHO GARNICA
## 628                       PEPSI-COLA MEXICANA
## 629                                   CIGATAM
## 630                                  BELTICOS
## 631                                  SABRITAS
## 632                                  SABRITAS
## 633                               GRUPO BIMBO
## 634                                  SABRITAS
## 635                            MOLINOS AZTECA
## 636                                 COCA COLA
## 637                      ALIMENTOS DEL FUERTE
## 638                                   CIGATAM
## 639                                  SABRITAS
## 640                                 COCA COLA
## 641                                  SABRITAS
## 642                       PEPSI-COLA MEXICANA
## 643                                 COCA COLA
## 644                            GRUPO PEÑAFIEL
## 645                       PEPSI-COLA MEXICANA
## 646                       PEPSI-COLA MEXICANA
## 647                 CONVERTIDORA DE PLASTICOS
## 648                       PEPSI-COLA MEXICANA
## 649                                  SABRITAS
## 650                                 COCA COLA
## 651                                 COCA COLA
## 652                       PEPSI-COLA MEXICANA
## 653                                 COCA COLA
## 654                       PEPSI-COLA MEXICANA
## 655                        UNILEVER DE MEXICO
## 656                        UNILEVER DE MEXICO
## 657                        UNILEVER DE MEXICO
## 658                                   CIGATAM
## 659                            MOLINOS AZTECA
## 660                                 COCA COLA
## 661                                 COCA COLA
## 662                                     JUMEX
## 663                                 COCA COLA
## 664                                 COCA COLA
## 665                                 COCA COLA
## 666                               GRUPO BIMBO
## 667                            MEGA ALIMENTOS
## 668                               GRUPO BIMBO
## 669                       PEPSI-COLA MEXICANA
## 670                       PEPSI-COLA MEXICANA
## 671                       PEPSI-COLA MEXICANA
## 672                            EMPRESAS TAJIN
## 673                           CIA. TOPO CHICO
## 674                       PEPSI-COLA MEXICANA
## 675                                 COCA COLA
## 676                                 COCA COLA
## 677                       PEPSI-COLA MEXICANA
## 678                                      LINK
## 679                                 COCA COLA
## 680                               CASA CUERVO
## 681                                 COCA COLA
## 682                                 COCA COLA
## 683                      LA ANITA CONDIMENTOS
## 684                                 DEL HOGAR
## 685                  PROCTER & GAMBLE COMPANY
## 686                                 COCA COLA
## 687                                 COCA COLA
## 688                       PEPSI-COLA MEXICANA
## 689                            CASA HERRADURA
## 690                                 COCA COLA
## 691                                 COCA COLA
## 692                                  SABRITAS
## 693                                 COCA COLA
## 694                         ALIMENTOS CAPULLO
## 695                      GILLETTE MANUFACTURA
## 696                        GOMEZ CUETARA HNOS
## 697                                     JUMEX
## 698                       PEPSI-COLA MEXICANA
## 699              JUGOS DEL VALLE S.A. DE C.V.
## 700          NACIONAL  DE ALIMENTOS Y HELADOS
## 701          NACIONAL  DE ALIMENTOS Y HELADOS
## 702                     GRUPO INDUSTRIAL LALA
## 703                                  SABRITAS
## 704                                      LINK
## 705                     GRUPO INDUSTRIAL LALA
## 706                          DANONE DE MEXICO
## 707                          DANONE DE MEXICO
## 708                                   CIGATAM
## 709                           SIGMA ALIMENTOS
## 710                                   CIGATAM
## 711          NACIONAL  DE ALIMENTOS Y HELADOS
## 712                                   FERRERO
## 713                                      LINK
## 714                                   KURUMBA
## 715                               GRUPO BIMBO
## 716                           CIA. TOPO CHICO
## 717                               GRUPO BIMBO
## 718                     GRUPO INDUSTRIAL LALA
## 719                                    AJEMEX
## 720              JUGOS DEL VALLE S.A. DE C.V.
## 721                                  SABRITAS
## 722                                  SABRITAS
## 723                       PEPSI-COLA MEXICANA
## 724                           VELADORA MEXICO
## 725                                 COCA COLA
## 726                                  SABRITAS
## 727                                    NEVADA
## 728                          DANONE DE MEXICO
## 729                                 COCA COLA
## 730          NACIONAL  DE ALIMENTOS Y HELADOS
## 731                                  SABRITAS
## 732                                   FERRERO
## 733                                 COCA COLA
## 734                               GRUPO BIMBO
## 735                       PEPSI-COLA MEXICANA
## 736                                 COCA COLA
## 737                               KRAFT FOODS
## 738                       PEPSI-COLA MEXICANA
## 739                     GRUPO INDUSTRIAL LALA
## 740                           SIGMA ALIMENTOS
## 741                                  SABRITAS
## 742                                  SABRITAS
## 743                       PEPSI-COLA MEXICANA
## 744                                 COCA COLA
## 745                                 COCA COLA
## 746              JUGOS DEL VALLE S.A. DE C.V.
## 747                                  SABRITAS
## 748                                  SABRITAS
## 749                                 COCA COLA
## 750                                   CIGATAM
## 751                  PROCTER & GAMBLE COMPANY
## 752                                 COCA COLA
## 753                                    NESTLE
## 754                                EMPACADOS 
## 755                                 COCA COLA
## 756                               CASA CUERVO
## 757                     GRUPO INDUSTRIAL LALA
## 758                                 COCA COLA
## 759                                   CIGATAM
## 760                        LABORATORIO MONELI
## 761                       ABSORMEX S.A DE C.V
## 762                                 COCA COLA
## 763                       PEPSI-COLA MEXICANA
## 764                 CONVERTIDORA DE PLASTICOS
## 765                              GRUPO GAMESA
## 766                                  SABRITAS
## 767                                 COCA COLA
## 768                                  SABRITAS
## 769                      GILLETTE MANUFACTURA
## 770                                   CIGATAM
## 771                                  SABRITAS
## 772                                 COCA COLA
## 773                                      ALEN
## 774                              GRUPO GAMESA
## 775                              GRUPO GAMESA
## 776                     GRUPO INDUSTRIAL LALA
## 777                       PEPSI-COLA MEXICANA
## 778              JUGOS DEL VALLE S.A. DE C.V.
## 779                       PEPSI-COLA MEXICANA
## 780                         ALIMENTOS CAPULLO
## 781                            TRES ESTRELLAS
## 782                               GRUPO BIMBO
## 783                     GRUPO INDUSTRIAL LALA
## 784                               GRUPO BIMBO
## 785                         RAGASA INDUSTRIAS
## 786                     GRUPO INDUSTRIAL LALA
## 787                                 COCA COLA
## 788                     GRUPO INDUSTRIAL LALA
## 789                                   FERRERO
## 790                                 COCA COLA
## 791                  PROCTER & GAMBLE COMPANY
## 792                                 COCA COLA
## 793                       PEPSI-COLA MEXICANA
## 794                     GRUPO INDUSTRIAL LALA
## 795                               GRUPO BIMBO
## 796                               GRUPO BIMBO
## 797                                 COCA COLA
## 798                                 COCA COLA
## 799                                   JUGOMEX
## 800                                    NEVADA
## 801                                 COCA COLA
## 802                                   FERRERO
## 803                                    NEVADA
## 804                       PEPSI-COLA MEXICANA
## 805                                   JUGOMEX
## 806                                   JUGOMEX
## 807                                 COCA COLA
## 808                                  SABRITAS
## 809                              GRUPO GAMESA
## 810                                     JUMEX
## 811                       PEPSI-COLA MEXICANA
## 812                       PEPSI-COLA MEXICANA
## 813                       PEPSI-COLA MEXICANA
## 814                       PEPSI-COLA MEXICANA
## 815                               GRUPO BIMBO
## 816        PRODUCTOS VERDE VALLE S.A. DE C.V.
## 817                                 COCA COLA
## 818                       PEPSI-COLA MEXICANA
## 819                                    HERDEZ
## 820                                  SABRITAS
## 821                                  SABRITAS
## 822                                 COCA COLA
## 823                               GRUPO BIMBO
## 824                       PEPSI-COLA MEXICANA
## 825                                    BARCEL
## 826                       PEPSI-COLA MEXICANA
## 827          NACIONAL  DE ALIMENTOS Y HELADOS
## 828                     GRUPO INDUSTRIAL LALA
## 829                       PEPSI-COLA MEXICANA
## 830                                    NESTLE
## 831                               GRUPO BIMBO
## 832                                   JUGOMEX
## 833                                 COCA COLA
## 834                      CONAGRA FOODS MEXICO
## 835                              GRUPO GAMESA
## 836                                 COCA COLA
## 837                                 COCA COLA
## 838                               GRUPO BIMBO
## 839                     GRUPO INDUSTRIAL LALA
## 840                                  QUALAMEX
## 841                     GRUPO INDUSTRIAL LALA
## 842                               GRUPO BIMBO
## 843              JUGOS DEL VALLE S.A. DE C.V.
## 844                       PEPSI-COLA MEXICANA
## 845                       PEPSI-COLA MEXICANA
## 846                                    NESTLE
## 847                                  SABRITAS
## 848              JUGOS DEL VALLE S.A. DE C.V.
## 849                  PROCTER & GAMBLE COMPANY
## 850                                  SABRITAS
## 851                       PEPSI-COLA MEXICANA
## 852                     GRUPO INDUSTRIAL LALA
## 853                               GRUPO BIMBO
## 854                               GRUPO BIMBO
## 855                               GRUPO BIMBO
## 856                                   MEXILAC
## 857                                    NESTLE
## 858                           CIA. TOPO CHICO
## 859                                   JUGOMEX
## 860                       PEPSI-COLA MEXICANA
## 861              JUGOS DEL VALLE S.A. DE C.V.
## 862                               GRUPO BIMBO
## 863                               GRUPO BIMBO
## 864                       PEPSI-COLA MEXICANA
## 865                               GRUPO BIMBO
## 866                               GRUPO BIMBO
## 867                       PEPSI-COLA MEXICANA
## 868                                   MEXILAC
## 869                                  SABRITAS
## 870                       PEPSI-COLA MEXICANA
## 871                                   FERRERO
## 872                       PEPSI-COLA MEXICANA
## 873                           CIA. TOPO CHICO
## 874                                 COCA COLA
## 875                       PEPSI-COLA MEXICANA
## 876                       PEPSI-COLA MEXICANA
## 877                                 COCA COLA
## 878                                 COCA COLA
## 879                                   MEXILAC
## 880                          DANONE DE MEXICO
## 881                                 COCA COLA
## 882                                 COCA COLA
## 883                                  SABRITAS
## 884                                   CIGATAM
## 885                       PEPSI-COLA MEXICANA
## 886                       PEPSI-COLA MEXICANA
## 887                                  SABRITAS
## 888                                 COCA COLA
## 889                              GRUPO GAMESA
## 890                                   MEXILAC
## 891                       PEPSI-COLA MEXICANA
## 892                       PEPSI-COLA MEXICANA
## 893                                  BELTICOS
## 894                                 COCA COLA
## 895                                  SABRITAS
## 896                               GRUPO BIMBO
## 897                     GRUPO INDUSTRIAL LALA
## 898                               GRUPO BIMBO
## 899           CERVECERIA CUAUHTEMOC MOCTEZUMA
## 900                                 COCA COLA
## 901                         COLGATE PALMOLIVE
## 902                               GRUPO BIMBO
## 903                         COLGATE PALMOLIVE
## 904                FABRICA DE JABON LA CORONA
## 905                      CONSERVAS LA COSTEÑA
## 906                      CONAGRA FOODS MEXICO
## 907                       PEPSI-COLA MEXICANA
## 908                      CONAGRA FOODS MEXICO
## 909                                  SABORMEX
## 910                         EMPACADORA NORVER
## 911                ACEITES GRASAS Y DERIVADOS
## 912              JUGOS DEL VALLE S.A. DE C.V.
## 913                                 COCA COLA
## 914                                  SABRITAS
## 915                       PEPSI-COLA MEXICANA
## 916               FABRICA DE JABON LA REINERA
## 917                          DANONE DE MEXICO
## 918                          DANONE DE MEXICO
## 919                FABRICA DE JABON LA CORONA
## 920                FABRICA DE JABON LA CORONA
## 921                                 COCA COLA
## 922                               GRUPO BIMBO
## 923                       PEPSI-COLA MEXICANA
## 924                       PEPSI-COLA MEXICANA
## 925                               GRUPO BIMBO
## 926                               GRUPO BIMBO
## 927                     GRUPO INDUSTRIAL LALA
## 928                     GRUPO INDUSTRIAL LALA
## 929                       PEPSI-COLA MEXICANA
## 930                                     JUMEX
## 931                           SALES DEL ISTMO
## 932                                 COCA COLA
## 933                FABRICA DE JABON LA CORONA
## 934                                   MEXILAC
## 935                                 COCA COLA
## 936                                    NEVADA
## 937                                  SABRITAS
## 938                      CONSERVAS LA COSTEÑA
## 939                 CONVERTIDORA DE PLASTICOS
## 940                               GRUPO BIMBO
## 941                                LA CENTRAL
## 942                               GRUPO BIMBO
## 943                       PEPSI-COLA MEXICANA
## 944                               GRUPO BIMBO
## 945                                 DEL HOGAR
## 946                           SIGMA ALIMENTOS
## 947                                 COCA COLA
## 948                                 COCA COLA
## 949                                      ALEN
## 950                    COMERCIALIZADORA GOMEZ
## 951                               GRUPO BIMBO
## 952                                  SABRITAS
## 953                                      LINK
## 954        PRODUCTOS VERDE VALLE S.A. DE C.V.
## 955                       PEPSI-COLA MEXICANA
## 956              JUGOS DEL VALLE S.A. DE C.V.
## 957              JUGOS DEL VALLE S.A. DE C.V.
## 958                                  SABRITAS
## 959                                      LINK
## 960                                  BELTICOS
## 961                TOSTADAS Y BOTANAS PREMIUM
## 962                                 COCA COLA
## 963                                  SABRITAS
## 964                               GRUPO BIMBO
## 965                       PEPSI-COLA MEXICANA
## 966                       PEPSI-COLA MEXICANA
## 967                                  RICOLINO
## 968                       PEPSI-COLA MEXICANA
## 969                                 COCA COLA
## 970              JUGOS DEL VALLE S.A. DE C.V.
## 971                                      LINK
## 972                       PEPSI-COLA MEXICANA
## 973                                 COCA COLA
## 974                               GRUPO BIMBO
## 975                       PEPSI-COLA MEXICANA
## 976                           SIGMA ALIMENTOS
## 977                                 COCA COLA
## 978                                  SABRITAS
## 979                                 COCA COLA
## 980                       PEPSI-COLA MEXICANA
## 981                        UNILEVER DE MEXICO
## 982                               GRUPO BIMBO
## 983                       PEPSI-COLA MEXICANA
## 984                                   MEXILAC
## 985                                 COCA COLA
## 986                                 COCA COLA
## 987                                  SABRITAS
## 988                       PEPSI-COLA MEXICANA
## 989                       PEPSI-COLA MEXICANA
## 990                                      LINK
## 991                            HERSHEY MEXICO
## 992                       PEPSI-COLA MEXICANA
## 993              JUGOS DEL VALLE S.A. DE C.V.
## 994        PRODUCTOS VERDE VALLE S.A. DE C.V.
## 995                       PEPSI-COLA MEXICANA
## 996                       PEPSI-COLA MEXICANA
## 997                       PEPSI-COLA MEXICANA
## 998                                 COCA COLA
## 999                               GRUPO BIMBO
## 1000                      PEPSI-COLA MEXICANA
## 1001                                COCA COLA
## 1002                      PEPSI-COLA MEXICANA
## 1003                                COCA COLA
## 1004                      PEPSI-COLA MEXICANA
## 1005                     CONAGRA FOODS MEXICO
## 1006                     CONSERVAS LA COSTEÑA
## 1007                                COCA COLA
## 1008                BOTANAS LEO, S.A. DE C.V.
## 1009                       GOMEZ CUETARA HNOS
## 1010                              GRUPO BIMBO
## 1011                       UNILEVER DE MEXICO
## 1012                        KELLOGG DE MEXICO
## 1013                                COCA COLA
## 1014             JUGOS DEL VALLE S.A. DE C.V.
## 1015             JUGOS DEL VALLE S.A. DE C.V.
## 1016                      PEPSI-COLA MEXICANA
## 1017                                  KURUMBA
## 1018                                 SABRITAS
## 1019                              GRUPO BIMBO
## 1020                         PRODUCTOS GERBER
## 1021                                    JUMEX
## 1022                                COCA COLA
## 1023          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 1024                                    JUMEX
## 1025                                     ALEN
## 1026                      PEPSI-COLA MEXICANA
## 1027                      PEPSI-COLA MEXICANA
## 1028                      PEPSI-COLA MEXICANA
## 1029                      PEPSI-COLA MEXICANA
## 1030                          SIGMA ALIMENTOS
## 1031                     ALIMENTOS DEL FUERTE
## 1032                        EMPACADORA NORVER
## 1033                                COCA COLA
## 1034                             GRUPO GAMESA
## 1035                                COCA COLA
## 1036                                COCA COLA
## 1037               FABRICA DE JABON LA CORONA
## 1038                           INDUSTRIAS H24
## 1039                          SIGMA ALIMENTOS
## 1040                                COCA COLA
## 1041                                COCA COLA
## 1042                                COCA COLA
## 1043                CONVERTIDORA DE PLASTICOS
## 1044                CONVERTIDORA DE PLASTICOS
## 1045                     ALIMENTOS DEL FUERTE
## 1046                                COCA COLA
## 1047                                COCA COLA
## 1048             JUGOS DEL VALLE S.A. DE C.V.
## 1049                              GRUPO BIMBO
## 1050                                 MARUCHAN
## 1051                    GRUPO INDUSTRIAL LALA
## 1052                                 MARUCHAN
## 1053                                     ALEN
## 1054                              KRAFT FOODS
## 1055                                COCA COLA
## 1056                              KRAFT FOODS
## 1057                          SIGMA ALIMENTOS
## 1058                                 MARUCHAN
## 1059                             GRUPO GAMESA
## 1060                                COCA COLA
## 1061                                 SABRITAS
## 1062             JUGOS DEL VALLE S.A. DE C.V.
## 1063                              GRUPO BIMBO
## 1064                                COCA COLA
## 1065                                   HERDEZ
## 1066                                COCA COLA
## 1067                                COCA COLA
## 1068                             GRUPO GAMESA
## 1069                      PEPSI-COLA MEXICANA
## 1070                                COCA COLA
## 1071         NACIONAL  DE ALIMENTOS Y HELADOS
## 1072                              GRUPO BIMBO
## 1073                      PEPSI-COLA MEXICANA
## 1074                                COCA COLA
## 1075                                COCA COLA
## 1076                      PEPSI-COLA MEXICANA
## 1077                      PEPSI-COLA MEXICANA
## 1078                           GRUPO PEÑAFIEL
## 1079                             GRUPO GAMESA
## 1080             JUGOS DEL VALLE S.A. DE C.V.
## 1081                                COCA COLA
## 1082                                COCA COLA
## 1083         NACIONAL  DE ALIMENTOS Y HELADOS
## 1084                      PEPSI-COLA MEXICANA
## 1085                                 DETERSOL
## 1086                      PEPSI-COLA MEXICANA
## 1087                                COCA COLA
## 1088             JUGOS DEL VALLE S.A. DE C.V.
## 1089                                COCA COLA
## 1090          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 1091                                 SABRITAS
## 1092                                 SABRITAS
## 1093                                 SABRITAS
## 1094                      PEPSI-COLA MEXICANA
## 1095                     ALIMENTOS DEL FUERTE
## 1096                                     ALEN
## 1097                                COCA COLA
## 1098                                COCA COLA
## 1099                                COCA COLA
## 1100                                 SABRITAS
## 1101                      PEPSI-COLA MEXICANA
## 1102         NACIONAL  DE ALIMENTOS Y HELADOS
## 1103                            CADBURY ADAMS
## 1104                           MOLINOS AZTECA
## 1105             JUGOS DEL VALLE S.A. DE C.V.
## 1106                                 SABRITAS
## 1107                                COCA COLA
## 1108                           GRUPO PEÑAFIEL
## 1109               PASTAS MOLISABA S.A DE C.V
## 1110                         PRODUCTOS GERBER
## 1111                                   CORONA
## 1112                              GRUPO BIMBO
## 1113                                COCA COLA
## 1114                                 SABRITAS
## 1115                                  CIGATAM
## 1116                                COCA COLA
## 1117                      PEPSI-COLA MEXICANA
## 1118                      PEPSI-COLA MEXICANA
## 1119                BOTANAS LEO, S.A. DE C.V.
## 1120                                COCA COLA
## 1121                                 SABRITAS
## 1122                              GRUPO BIMBO
## 1123                                COCA COLA
## 1124                                 SABRITAS
## 1125                                 SABRITAS
## 1126                                COCA COLA
## 1127                                 SABRITAS
## 1128                      PEPSI-COLA MEXICANA
## 1129                          SIGMA ALIMENTOS
## 1130                      PEPSI-COLA MEXICANA
## 1131                      PEPSI-COLA MEXICANA
## 1132                      PEPSI-COLA MEXICANA
## 1133                                COCA COLA
## 1134                      PEPSI-COLA MEXICANA
## 1135                           GRUPO PEÑAFIEL
## 1136                      PEPSI-COLA MEXICANA
## 1137                              GRUPO BIMBO
## 1138                                    JUMEX
## 1139                        ALIMENTOS CAPULLO
## 1140                      PEPSI-COLA MEXICANA
## 1141                          SIGMA ALIMENTOS
## 1142                      PEPSI-COLA MEXICANA
## 1143               FABRICA DE JABON LA CORONA
## 1144                      PEPSI-COLA MEXICANA
## 1145                              GRUPO BIMBO
## 1146                                 BELTICOS
## 1147                         MASTER FOODS USA
## 1148                CONVERTIDORA DE PLASTICOS
## 1149                                COCA COLA
## 1150                CONVERTIDORA DE PLASTICOS
## 1151         NACIONAL  DE ALIMENTOS Y HELADOS
## 1152                     BRISTOL-MYERS SQUIBB
## 1153                                COCA COLA
## 1154                                 BELTICOS
## 1155                CONVERTIDORA DE PLASTICOS
## 1156                                  CIGATAM
## 1157                PESCADOS INDUSTRIALIZADOS
## 1158                             GRUPO GAMESA
## 1159                          SIGMA ALIMENTOS
## 1160                      PEPSI-COLA MEXICANA
## 1161                      PEPSI-COLA MEXICANA
## 1162               TOSTADAS Y BOTANAS PREMIUM
## 1163                CONVERTIDORA DE PLASTICOS
## 1164                                COCA COLA
## 1165                                 QUALAMEX
## 1166                      PEPSI-COLA MEXICANA
## 1167                                     LINK
## 1168                           GRUPO PEÑAFIEL
## 1169                CONVERTIDORA DE PLASTICOS
## 1170                      PEPSI-COLA MEXICANA
## 1171          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 1172                                 SABRITAS
## 1173                                 SABRITAS
## 1174                                 SABRITAS
## 1175          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 1176                              GRUPO BIMBO
## 1177                      PEPSI-COLA MEXICANA
## 1178                                 SABRITAS
## 1179                                 SABRITAS
## 1180                                 SABRITAS
## 1181                                COCA COLA
## 1182                                COCA COLA
## 1183                      PEPSI-COLA MEXICANA
## 1184                      PEPSI-COLA MEXICANA
## 1185                      PEPSI-COLA MEXICANA
## 1186                                 SABRITAS
## 1187          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 1188                           BOTANAS BOGO´S
## 1189                           BOTANAS BOGO´S
## 1190                           BOTANAS BOGO´S
## 1191                             GRUPO GAMESA
## 1192                                     ALEN
## 1193                              GRUPO BIMBO
## 1194                                     ALEN
## 1195                                     ALEN
## 1196               FABRICA DE JABON LA CORONA
## 1197                      PEPSI-COLA MEXICANA
## 1198                        COLGATE PALMOLIVE
## 1199                                 SABRITAS
## 1200                                COCA COLA
## 1201                      PEPSI-COLA MEXICANA
## 1202                      PEPSI-COLA MEXICANA
## 1203                      PEPSI-COLA MEXICANA
## 1204                CONVERTIDORA DE PLASTICOS
## 1205                CONVERTIDORA DE PLASTICOS
## 1206             JUGOS DEL VALLE S.A. DE C.V.
## 1207                                 SABRITAS
## 1208                      PEPSI-COLA MEXICANA
## 1209                           EMPRESAS TAJIN
## 1210                                COCA COLA
## 1211                                   ACT II
## 1212                                 MARUCHAN
## 1213                      PEPSI-COLA MEXICANA
## 1214                           EFEM DE MEXICO
## 1215                                  CIGATAM
## 1216                                   NESTLE
## 1217                             GRUPO GAMESA
## 1218                              KRAFT FOODS
## 1219         NACIONAL  DE ALIMENTOS Y HELADOS
## 1220                     BRISTOL-MYERS SQUIBB
## 1221                                     LINK
## 1222                      PEPSI-COLA MEXICANA
## 1223                                 SABRITAS
## 1224                                     ALEN
## 1225                                   NESTLE
## 1226                      PEPSI-COLA MEXICANA
## 1227                                 RICOLINO
## 1228          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 1229                      PEPSI-COLA MEXICANA
## 1230                BOTANAS LEO, S.A. DE C.V.
## 1231                    GRUPO INDUSTRIAL LALA
## 1232                                COCA COLA
## 1233                                 SABRITAS
## 1234                      PEPSI-COLA MEXICANA
## 1235                      PEPSI-COLA MEXICANA
## 1236                                COCA COLA
## 1237                      PEPSI-COLA MEXICANA
## 1238                                 SABRITAS
## 1239                                COCA COLA
## 1240                                COCA COLA
## 1241                                COCA COLA
## 1242                                  KURUMBA
## 1243                                COCA COLA
## 1244                                 SABRITAS
## 1245                                 MARUCHAN
## 1246                      ABSORMEX S.A DE C.V
## 1247                                 SABRITAS
## 1248                                COCA COLA
## 1249                                 SABRITAS
## 1250                      PEPSI-COLA MEXICANA
## 1251 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 1252                       EMPACADORA JIMENEZ
## 1253                      PEPSI-COLA MEXICANA
## 1254                    S. C. JOHNSON AND SON
## 1255                                COCA COLA
## 1256                     ALIMENTOS DEL FUERTE
## 1257                CONVERTIDORA DE PLASTICOS
## 1258                                   ACT II
## 1259                CONVERTIDORA DE PLASTICOS
## 1260                              GRUPO BIMBO
## 1261                                COCA COLA
## 1262                      INDUSTRIAS KOLALOKA
## 1263                                   NEVADA
## 1264                                     LINK
## 1265 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 1266         NACIONAL  DE ALIMENTOS Y HELADOS
## 1267                                 SABRITAS
## 1268 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 1269                                COCA COLA
## 1270 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 1271                BOTANAS LEO, S.A. DE C.V.
## 1272                      PEPSI-COLA MEXICANA
## 1273                                 MARUCHAN
## 1274                      PEPSI-COLA MEXICANA
## 1275                                COCA COLA
## 1276                                 SABRITAS
## 1277               TOSTADAS Y BOTANAS PREMIUM
## 1278                                COCA COLA
## 1279                                COCA COLA
## 1280              TOSTADAS HIDALGO S.A DE C.V
## 1281                          SIGMA ALIMENTOS
## 1282                                  CIGATAM
## 1283                              GRUPO BIMBO
## 1284                    GRUPO INDUSTRIAL LALA
## 1285                                  KURUMBA
## 1286                                   ACT II
## 1287                      PEPSI-COLA MEXICANA
## 1288                       UNILEVER DE MEXICO
## 1289                              GRUPO BIMBO
## 1290                          SIGMA ALIMENTOS
## 1291                                COCA COLA
## 1292                             GRUPO GAMESA
## 1293       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 1294                          SIGMA ALIMENTOS
## 1295                                COCA COLA
## 1296                                COCA COLA
## 1297                      PEPSI-COLA MEXICANA
## 1298                                COCA COLA
## 1299                BOTANAS LEO, S.A. DE C.V.
## 1300                                COCA COLA
## 1301                      PEPSI-COLA MEXICANA
## 1302                          CIA. TOPO CHICO
## 1303               ACEITES GRASAS Y DERIVADOS
## 1304                                 MARUCHAN
## 1305                                   ACT II
## 1306                      PEPSI-COLA MEXICANA
## 1307                                COCA COLA
## 1308                                COCA COLA
## 1309                      PEPSI-COLA MEXICANA
## 1310                      PEPSI-COLA MEXICANA
## 1311             JUGOS DEL VALLE S.A. DE C.V.
## 1312                          CIA. TOPO CHICO
## 1313                           SALSA TAMAZULA
## 1314                              GRUPO BIMBO
## 1315                                 MARUCHAN
## 1316                                COCA COLA
## 1317                             AJEMONTERREY
## 1318                              GRUPO BIMBO
## 1319                      PEPSI-COLA MEXICANA
## 1320                                COCA COLA
## 1321                        ALIMENTOS CAPULLO
## 1322                              KRAFT FOODS
## 1323                                  CIGATAM
## 1324                 PROCTER & GAMBLE COMPANY
## 1325                BOTANAS LEO, S.A. DE C.V.
## 1326                                 SABRITAS
## 1327                     CONAGRA FOODS MEXICO
## 1328                     GILLETTE MANUFACTURA
## 1329                        EMPACADORA NORVER
## 1330                                  CIGATAM
## 1331                                 SABRITAS
## 1332                                 LIQUIMEX
## 1333                                 SABRITAS
## 1334                      PEPSI-COLA MEXICANA
## 1335                                     LINK
## 1336                                COCA COLA
## 1337                                COCA COLA
## 1338                             GRUPO GAMESA
## 1339                    GRUPO INDUSTRIAL LALA
## 1340                             GRUPO GAMESA
## 1341                                  CIGATAM
## 1342                      PEPSI-COLA MEXICANA
## 1343                       UNILEVER DE MEXICO
## 1344                                 SABRITAS
## 1345                      PEPSI-COLA MEXICANA
## 1346                      PEPSI-COLA MEXICANA
## 1347                CONVERTIDORA DE PLASTICOS
## 1348                CONVERTIDORA DE PLASTICOS
## 1349                                COCA COLA
## 1350                              GRUPO BIMBO
## 1351                              GRUPO BIMBO
## 1352                                COCA COLA
## 1353                                COCA COLA
## 1354                                COCA COLA
## 1355                             GRUPO GAMESA
## 1356                        COLGATE PALMOLIVE
## 1357                 PROCTER & GAMBLE COMPANY
## 1358                                COCA COLA
## 1359                      PEPSI-COLA MEXICANA
## 1360                      PEPSI-COLA MEXICANA
## 1361                                 SABRITAS
## 1362                                  JUGOMEX
## 1363               FABRICA DE JABON LA CORONA
## 1364                                COCA COLA
## 1365                      PEPSI-COLA MEXICANA
## 1366                      PEPSI-COLA MEXICANA
## 1367                      PEPSI-COLA MEXICANA
## 1368                              GRUPO BIMBO
## 1369                                 SABRITAS
## 1370                                 SABRITAS
## 1371                      PEPSI-COLA MEXICANA
## 1372                                     LINK
## 1373                           GRUPO PEÑAFIEL
## 1374                                 SABRITAS
## 1375                                COCA COLA
## 1376                                COCA COLA
## 1377                              GRUPO BIMBO
## 1378                             GRUPO GAMESA
## 1379                                 SABRITAS
## 1380                      PEPSI-COLA MEXICANA
## 1381                                 SABRITAS
## 1382                                     ALEN
## 1383                      PEPSI-COLA MEXICANA
## 1384                          SIGMA ALIMENTOS
## 1385                             GRUPO GAMESA
## 1386                                     ALEN
## 1387                                COCA COLA
## 1388                                COCA COLA
## 1389              FABRICA DE JABON LA REINERA
## 1390                                     ALEN
## 1391                                COCA COLA
## 1392                                   HENKEL
## 1393                 PROCTER & GAMBLE COMPANY
## 1394                                COCA COLA
## 1395                                   NEVADA
## 1396                      PEPSI-COLA MEXICANA
## 1397                                COCA COLA
## 1398                      PEPSI-COLA MEXICANA
## 1399                                 SABRITAS
## 1400                BOTANAS LEO, S.A. DE C.V.
## 1401                      PEPSI-COLA MEXICANA
## 1402                                COCA COLA
## 1403                      PEPSI-COLA MEXICANA
## 1404                            CADBURY ADAMS
## 1405                                CONFICORP
## 1406                       UNILEVER DE MEXICO
## 1407                              GRUPO BIMBO
## 1408                                   NESTLE
## 1409                             GRUPO GAMESA
## 1410                    GRUPO INDUSTRIAL LALA
## 1411                              KRAFT FOODS
## 1412                                     LINK
## 1413                      PEPSI-COLA MEXICANA
## 1414                                     ALEN
## 1415                      PEPSI-COLA MEXICANA
## 1416                                  FERRERO
## 1417                                COCA COLA
## 1418                      PEPSI-COLA MEXICANA
## 1419             JUGOS DEL VALLE S.A. DE C.V.
## 1420                                 SABRITAS
## 1421                 PROCTER & GAMBLE COMPANY
## 1422                                  MEXILAC
## 1423                                COCA COLA
## 1424                      PEPSI-COLA MEXICANA
## 1425                      PEPSI-COLA MEXICANA
## 1426                                COCA COLA
## 1427                              GRUPO BIMBO
## 1428                       EMPACADORA JIMENEZ
## 1429                                 SABRITAS
## 1430                                COCA COLA
## 1431                    GRUPO INDUSTRIAL LALA
## 1432                      PEPSI-COLA MEXICANA
## 1433                       LAMBI S.A. DE C.V.
## 1434                                  KURUMBA
## 1435                            CADBURY ADAMS
## 1436                                COCA COLA
## 1437                           GRUPO PEÑAFIEL
## 1438                      PEPSI-COLA MEXICANA
## 1439                CONVERTIDORA DE PLASTICOS
## 1440                CONVERTIDORA DE PLASTICOS
## 1441                                  CIGATAM
## 1442                                COCA COLA
## 1443                                 SABRITAS
## 1444                              GRUPO BIMBO
## 1445                                  KURUMBA
## 1446                          CIA. TOPO CHICO
## 1447                                   HERDEZ
## 1448                     BRISTOL-MYERS SQUIBB
## 1449                                COCA COLA
## 1450                      PEPSI-COLA MEXICANA
## 1451                      PEPSI-COLA MEXICANA
## 1452                                 SABRITAS
## 1453                      PEPSI-COLA MEXICANA
## 1454                                  CIGATAM
## 1455                             GRUPO GAMESA
## 1456                                 SABRITAS
## 1457                                COCA COLA
## 1458 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 1459                         DANONE DE MEXICO
## 1460               PASTAS MOLISABA S.A DE C.V
## 1461                    S. C. JOHNSON AND SON
## 1462                                   NESTLE
## 1463                       EMPACADORA JIMENEZ
## 1464                          SIGMA ALIMENTOS
## 1465                          SALES DEL ISTMO
## 1466                      PEPSI-COLA MEXICANA
## 1467                      PEPSI-COLA MEXICANA
## 1468                                COCA COLA
## 1469                                  MEXILAC
## 1470                                COCA COLA
## 1471                     CONSERVAS LA COSTEÑA
## 1472                                  MEXILAC
## 1473                                COCA COLA
## 1474                                 SABRITAS
## 1475                              GRUPO BIMBO
## 1476             JUGOS DEL VALLE S.A. DE C.V.
## 1477                                     LINK
## 1478                      PEPSI-COLA MEXICANA
## 1479                         DANONE DE MEXICO
## 1480                     CONSERVAS LA COSTEÑA
## 1481                                  CIGATAM
## 1482                            LAFONT LAUNAY
## 1483                           KIMBERLY CLARK
## 1484                    GRUPO INDUSTRIAL LALA
## 1485                         DANONE DE MEXICO
## 1486                 PROCTER & GAMBLE COMPANY
## 1487                                COCA COLA
## 1488                                 SABRITAS
## 1489                         MASTER FOODS USA
## 1490                                 SABRITAS
## 1491                      PEPSI-COLA MEXICANA
## 1492                              GRUPO BIMBO
## 1493                                 SABRITAS
## 1494                      PEPSI-COLA MEXICANA
## 1495                             GRUPO GAMESA
## 1496                      PEPSI-COLA MEXICANA
## 1497                                  CIGATAM
## 1498                                COCA COLA
## 1499                                COCA COLA
## 1500                      PEPSI-COLA MEXICANA
## 1501                                COCA COLA
## 1502                      PEPSI-COLA MEXICANA
## 1503                                     LINK
## 1504                              GRUPO BIMBO
## 1505                                  CIGATAM
## 1506                                 SABRITAS
## 1507                      PEPSI-COLA MEXICANA
## 1508             JUGOS DEL VALLE S.A. DE C.V.
## 1509                                 SABRITAS
## 1510                    GRUPO INDUSTRIAL LALA
## 1511                          SIGMA ALIMENTOS
## 1512                                 LIQUIMEX
## 1513             JUGOS DEL VALLE S.A. DE C.V.
## 1514                              GRUPO BIMBO
## 1515                         DANONE DE MEXICO
## 1516                                COCA COLA
## 1517                              GRUPO BIMBO
## 1518                                COCA COLA
## 1519             JUGOS DEL VALLE S.A. DE C.V.
## 1520             JUGOS DEL VALLE S.A. DE C.V.
## 1521   IMPORTACIONES HNOS. CANTú S.A. DE C.V.
## 1522                      PEPSI-COLA MEXICANA
## 1523       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 1524                                COCA COLA
## 1525                                COCA COLA
## 1526                      PEPSI-COLA MEXICANA
## 1527          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 1528                                COCA COLA
## 1529                                   NESTLE
## 1530                CONVERTIDORA DE PLASTICOS
## 1531                CONVERTIDORA DE PLASTICOS
## 1532                BOTANAS LEO, S.A. DE C.V.
## 1533                              GRUPO BIMBO
## 1534 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 1535                     CONSERVAS LA COSTEÑA
## 1536               FABRICA DE JABON LA CORONA
## 1537                          SIGMA ALIMENTOS
## 1538                                COCA COLA
## 1539 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 1540                BOTANAS LEO, S.A. DE C.V.
## 1541                                     ALEN
## 1542                                COCA COLA
## 1543                BOTANAS LEO, S.A. DE C.V.
## 1544                                COCA COLA
## 1545                    GRUPO INDUSTRIAL LALA
## 1546                      PEPSI-COLA MEXICANA
## 1547                                     LINK
## 1548                                COCA COLA
## 1549                                COCA COLA
## 1550                      PEPSI-COLA MEXICANA
## 1551                                 QUALAMEX
## 1552                     GILLETTE MANUFACTURA
## 1553                              GRUPO BIMBO
## 1554                              GRUPO BIMBO
## 1555                                   ACT II
## 1556             JUGOS DEL VALLE S.A. DE C.V.
## 1557                              GRUPO BIMBO
## 1558                                 SABRITAS
## 1559                                     LINK
## 1560                                COCA COLA
## 1561                                 SABRITAS
## 1562                                COCA COLA
## 1563                       UNILEVER DE MEXICO
## 1564                      PEPSI-COLA MEXICANA
## 1565                      PEPSI-COLA MEXICANA
## 1566                          SIGMA ALIMENTOS
## 1567                     ALIMENTOS DEL FUERTE
## 1568       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 1569                    GRUPO INDUSTRIAL LALA
## 1570                      PEPSI-COLA MEXICANA
## 1571                                     ALEN
## 1572                BOTANAS LEO, S.A. DE C.V.
## 1573                                COCA COLA
## 1574                              KRAFT FOODS
## 1575             JUGOS DEL VALLE S.A. DE C.V.
## 1576                      PEPSI-COLA MEXICANA
## 1577                      PEPSI-COLA MEXICANA
## 1578                      PEPSI-COLA MEXICANA
## 1579                             GRUPO GAMESA
## 1580                                  MEXILAC
## 1581                                 BELTICOS
## 1582                                 SABRITAS
## 1583                      PEPSI-COLA MEXICANA
## 1584                              GRUPO BIMBO
## 1585                          SIGMA ALIMENTOS
## 1586                           BOTANAS BOGO´S
## 1587                           BOTANAS BOGO´S
## 1588                                  FERRERO
## 1589                                COCA COLA
## 1590               FABRICA DE JABON LA CORONA
## 1591               FABRICA DE JABON LA CORONA
## 1592                          SIGMA ALIMENTOS
## 1593                              GRUPO BIMBO
## 1594                          SIGMA ALIMENTOS
## 1595                      PEPSI-COLA MEXICANA
## 1596                                COCA COLA
## 1597                    GRUPO INDUSTRIAL LALA
## 1598                          CIA. TOPO CHICO
## 1599                              GRUPO BIMBO
## 1600                    GRUPO INDUSTRIAL LALA
## 1601                              GRUPO BIMBO
## 1602                              GRUPO BIMBO
## 1603                    GRUPO INDUSTRIAL LALA
## 1604                              GRUPO BIMBO
## 1605                                COCA COLA
## 1606                      PEPSI-COLA MEXICANA
## 1607                     BRISTOL-MYERS SQUIBB
## 1608                             GRUPO GAMESA
## 1609                      PEPSI-COLA MEXICANA
## 1610                                COCA COLA
## 1611                                COCA COLA
## 1612                                COCA COLA
## 1613                      PEPSI-COLA MEXICANA
## 1614                      PEPSI-COLA MEXICANA
## 1615                              GRUPO BIMBO
## 1616                                COCA COLA
## 1617                                COCA COLA
## 1618                      PEPSI-COLA MEXICANA
## 1619                                     LINK
## 1620       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 1621            SANTA CLARA PRODUCTOS LACTEOS
## 1622                                  FERRERO
## 1623                CONVERTIDORA DE PLASTICOS
## 1624                      PEPSI-COLA MEXICANA
## 1625                      PEPSI-COLA MEXICANA
## 1626                                   NESTLE
## 1627                    GRUPO INDUSTRIAL LALA
## 1628                      PEPSI-COLA MEXICANA
## 1629                                  MEXILAC
## 1630                                    JUMEX
## 1631                                COCA COLA
## 1632                              GRUPO BIMBO
## 1633                              KRAFT FOODS
## 1634                    GRUPO INDUSTRIAL LALA
## 1635                            CADBURY ADAMS
## 1636                      PEPSI-COLA MEXICANA
## 1637                      PEPSI-COLA MEXICANA
## 1638                        COLGATE PALMOLIVE
## 1639                                 QUALAMEX
## 1640                                 SABRITAS
## 1641                                     LINK
## 1642                                  KURUMBA
## 1643                      PEPSI-COLA MEXICANA
## 1644                      PEPSI-COLA MEXICANA
## 1645                          CIA. TOPO CHICO
## 1646                                  MEXILAC
## 1647                      PEPSI-COLA MEXICANA
## 1648                       EMPACADORA JIMENEZ
## 1649                              GRUPO BIMBO
## 1650                                   NESTLE
## 1651                          CIA. TOPO CHICO
## 1652                                COCA COLA
## 1653                                COCA COLA
## 1654                                COCA COLA
## 1655                                COCA COLA
## 1656                                COCA COLA
## 1657                                COCA COLA
## 1658                                  CIGATAM
## 1659             JUGOS DEL VALLE S.A. DE C.V.
## 1660                                     LINK
## 1661                      PEPSI-COLA MEXICANA
## 1662                                     LINK
## 1663                                COCA COLA
## 1664             JUGOS DEL VALLE S.A. DE C.V.
## 1665                CONVERTIDORA DE PLASTICOS
## 1666                      PEPSI-COLA MEXICANA
## 1667                                COCA COLA
## 1668                                  CIGATAM
## 1669                                  CIGATAM
## 1670                      PEPSI-COLA MEXICANA
## 1671                              GRUPO BIMBO
## 1672                      PEPSI-COLA MEXICANA
## 1673                                     LINK
## 1674                                 MARUCHAN
## 1675                      PEPSI-COLA MEXICANA
## 1676                      PEPSI-COLA MEXICANA
## 1677                                  KURUMBA
## 1678                         MASTER FOODS USA
## 1679                             GRUPO GAMESA
## 1680                      PEPSI-COLA MEXICANA
## 1681                      PEPSI-COLA MEXICANA
## 1682                              GRUPO BIMBO
## 1683                                COCA COLA
## 1684                                COCA COLA
## 1685                                COCA COLA
## 1686                              GRUPO BIMBO
## 1687                                  CIGATAM
## 1688                       GOMEZ CUETARA HNOS
## 1689                      PEPSI-COLA MEXICANA
## 1690                          VELADORA MEXICO
## 1691                      PEPSI-COLA MEXICANA
## 1692             JUGOS DEL VALLE S.A. DE C.V.
## 1693                                   NEVADA
## 1694                                COCA COLA
## 1695                         DANONE DE MEXICO
## 1696                      PEPSI-COLA MEXICANA
## 1697                      PEPSI-COLA MEXICANA
## 1698                      PEPSI-COLA MEXICANA
## 1699                                 RICOLINO
## 1700                      PEPSI-COLA MEXICANA
## 1701                                 SABRITAS
## 1702                                  MEXILAC
## 1703                                COCA COLA
## 1704                    GRUPO INDUSTRIAL LALA
## 1705                     BRISTOL-MYERS SQUIBB
## 1706                                COCA COLA
## 1707                                 SABRITAS
## 1708                                 SABRITAS
## 1709                                 SABRITAS
## 1710                 PROCTER & GAMBLE COMPANY
## 1711                                COCA COLA
## 1712       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 1713                                     ALEN
## 1714                         PRODUCTOS GERBER
## 1715                 PROCTER & GAMBLE COMPANY
## 1716                      PEPSI-COLA MEXICANA
## 1717                                COCA COLA
## 1718                                COCA COLA
## 1719                      PEPSI-COLA MEXICANA
## 1720                      PEPSI-COLA MEXICANA
## 1721                      PEPSI-COLA MEXICANA
## 1722                              GRUPO BIMBO
## 1723                      PEPSI-COLA MEXICANA
## 1724                    GRUPO INDUSTRIAL LALA
## 1725                    GRUPO INDUSTRIAL LALA
## 1726                      PEPSI-COLA MEXICANA
## 1727                       MOLINERA DE MEXICO
## 1728                                COCA COLA
## 1729                    GRUPO INDUSTRIAL LALA
## 1730                                COCA COLA
## 1731                                COCA COLA
## 1732                             DULCES  VERO
## 1733                                     MARS
## 1734                                   HENKEL
## 1735                                 SABRITAS
## 1736         NACIONAL  DE ALIMENTOS Y HELADOS
## 1737                      PEPSI-COLA MEXICANA
## 1738                                   NESTLE
## 1739                                 QUALAMEX
## 1740                                COCA COLA
## 1741                                COCA COLA
## 1742                                COCA COLA
## 1743       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 1744                             GRUPO GAMESA
## 1745                PESCADOS INDUSTRIALIZADOS
## 1746                           EFEM DE MEXICO
## 1747                                COCA COLA
## 1748                                   HERDEZ
## 1749               FABRICA DE JABON LA CORONA
## 1750                        COLGATE PALMOLIVE
## 1751                                 SABRITAS
## 1752                             GRUPO GAMESA
## 1753                      PEPSI-COLA MEXICANA
## 1754                      PEPSI-COLA MEXICANA
## 1755       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 1756                                  CIGATAM
## 1757                                     ALEN
## 1758                 PROCTER & GAMBLE COMPANY
## 1759           FABRICA DE PAPEL SAN FRANCISCO
## 1760                                  CIGATAM
## 1761                           GRUPO PEÑAFIEL
## 1762                                 SABRITAS
## 1763               FABRICA DE JABON LA CORONA
## 1764                BOTANAS LEO, S.A. DE C.V.
## 1765                       EMPACADORA JIMENEZ
## 1766                             GRUPO GAMESA
## 1767                                 SABRITAS
## 1768                      PEPSI-COLA MEXICANA
## 1769                      PEPSI-COLA MEXICANA
## 1770                      PEPSI-COLA MEXICANA
## 1771                    GRUPO INDUSTRIAL LALA
## 1772                     BRISTOL-MYERS SQUIBB
## 1773                                COCA COLA
## 1774                                   NESTLE
## 1775                                COCA COLA
## 1776                      PEPSI-COLA MEXICANA
## 1777                     CONAGRA FOODS MEXICO
## 1778                                COCA COLA
## 1779                                COCA COLA
## 1780                                   NESTLE
## 1781               FABRICA DE JABON LA CORONA
## 1782                                     LINK
## 1783                                COCA COLA
## 1784                                COCA COLA
## 1785         NACIONAL  DE ALIMENTOS Y HELADOS
## 1786                                  KURUMBA
## 1787         NACIONAL  DE ALIMENTOS Y HELADOS
## 1788                              GRUPO BIMBO
## 1789                             GRUPO GAMESA
## 1790                                    JUMEX
## 1791                                COCA COLA
## 1792                              GRUPO BIMBO
## 1793                             GRUPO GAMESA
## 1794                      PEPSI-COLA MEXICANA
## 1795                              GRUPO BIMBO
## 1796                             GRUPO GAMESA
## 1797                                 SABRITAS
## 1798                      PEPSI-COLA MEXICANA
## 1799                          CIA. TOPO CHICO
## 1800                      PEPSI-COLA MEXICANA
## 1801                                  KURUMBA
## 1802                    GRUPO INDUSTRIAL LALA
## 1803                              GRUPO BIMBO
## 1804                          SIGMA ALIMENTOS
## 1805                                 SABRITAS
## 1806                                 SABRITAS
## 1807                         MASTER FOODS USA
## 1808                                COCA COLA
## 1809                   COMERCIALIZADORA GOMEZ
## 1810                                COCA COLA
## 1811                                 SABRITAS
## 1812                      PEPSI-COLA MEXICANA
## 1813                                 SABRITAS
## 1814                           GRUPO PEÑAFIEL
## 1815                              GRUPO BIMBO
## 1816                    GRUPO INDUSTRIAL LALA
## 1817                                COCA COLA
## 1818                                     LINK
## 1819                                COCA COLA
## 1820                              GRUPO BIMBO
## 1821                 PROCTER & GAMBLE COMPANY
## 1822                              GRUPO BIMBO
## 1823                 PROCTER & GAMBLE COMPANY
## 1824                      PEPSI-COLA MEXICANA
## 1825                          CIA. TOPO CHICO
## 1826                              GRUPO BIMBO
## 1827                     CONSERVAS LA COSTEÑA
## 1828                      PEPSI-COLA MEXICANA
## 1829                      PEPSI-COLA MEXICANA
## 1830                                  CIGATAM
## 1831                      PEPSI-COLA MEXICANA
## 1832                        PRODUCTOS PREMIER
## 1833                                  CIGATAM
## 1834                                COCA COLA
## 1835                                  JUGOMEX
## 1836                                    JUMEX
## 1837                              GRUPO BIMBO
## 1838                BOTANAS LEO, S.A. DE C.V.
## 1839                BOTANAS LEO, S.A. DE C.V.
## 1840                                   ACT II
## 1841                      PEPSI-COLA MEXICANA
## 1842                                   ACT II
## 1843                                 SABRITAS
## 1844                      PEPSI-COLA MEXICANA
## 1845                                COCA COLA
## 1846                                COCA COLA
## 1847                                COCA COLA
## 1848                                 SABORMEX
## 1849                                COCA COLA
## 1850                                COCA COLA
## 1851                                   NESTLE
## 1852                                    JUMEX
## 1853                             GRUPO GAMESA
## 1854                                 MARUCHAN
## 1855                                 SABRITAS
## 1856                                 MARUCHAN
## 1857                      PEPSI-COLA MEXICANA
## 1858                              GRUPO BIMBO
## 1859                      PEPSI-COLA MEXICANA
## 1860                                COCA COLA
## 1861                                 SABRITAS
## 1862                                COCA COLA
## 1863                          CIA. TOPO CHICO
## 1864                      PEPSI-COLA MEXICANA
## 1865                                  CIGATAM
## 1866                                 SABRITAS
## 1867                                COCA COLA
## 1868                           BOTANAS BOGO´S
## 1869                                COCA COLA
## 1870                                  MEXILAC
## 1871                      PEPSI-COLA MEXICANA
## 1872                      PEPSI-COLA MEXICANA
## 1873                      PEPSI-COLA MEXICANA
## 1874                          SALES DEL ISTMO
## 1875                              GRUPO BIMBO
## 1876                                 MARUCHAN
## 1877                                COCA COLA
## 1878                      PEPSI-COLA MEXICANA
## 1879                              GRUPO BIMBO
## 1880                                COCA COLA
## 1881             JUGOS DEL VALLE S.A. DE C.V.
## 1882                        ALIMENTOS CAPULLO
## 1883                                 SABRITAS
## 1884                                COCA COLA
## 1885                      PEPSI-COLA MEXICANA
## 1886                                 QUALAMEX
## 1887                                 QUALAMEX
## 1888                           MOLINOS AZTECA
## 1889             JUGOS DEL VALLE S.A. DE C.V.
## 1890                           EFEM DE MEXICO
## 1891                                COCA COLA
## 1892                                COCA COLA
## 1893                 PROCTER & GAMBLE COMPANY
## 1894                      PEPSI-COLA MEXICANA
## 1895             JUGOS DEL VALLE S.A. DE C.V.
## 1896                              GRUPO BIMBO
## 1897                       UNILEVER DE MEXICO
## 1898                              KRAFT FOODS
## 1899                BOTANAS LEO, S.A. DE C.V.
## 1900                      PEPSI-COLA MEXICANA
## 1901                                COCA COLA
## 1902                                  KURUMBA
## 1903                                COCA COLA
## 1904                      PEPSI-COLA MEXICANA
## 1905                                 RICOLINO
## 1906                      PEPSI-COLA MEXICANA
## 1907                              GRUPO BIMBO
## 1908                    GRUPO INDUSTRIAL LALA
## 1909                          SALES DEL ISTMO
## 1910                                COCA COLA
## 1911                              GRUPO BIMBO
## 1912                      PEPSI-COLA MEXICANA
## 1913                            CADBURY ADAMS
## 1914                      PEPSI-COLA MEXICANA
## 1915                 PROCTER & GAMBLE COMPANY
## 1916                              GRUPO BIMBO
## 1917                                 SABRITAS
## 1918                              GRUPO BIMBO
## 1919                      PEPSI-COLA MEXICANA
## 1920                      PEPSI-COLA MEXICANA
## 1921                      PEPSI-COLA MEXICANA
## 1922                    GRUPO INDUSTRIAL LALA
## 1923                                  CIGATAM
## 1924                              KRAFT FOODS
## 1925                              GRUPO BIMBO
## 1926                                  CIGATAM
## 1927         NACIONAL  DE ALIMENTOS Y HELADOS
## 1928                              GRUPO BIMBO
## 1929                              KRAFT FOODS
## 1930                                  CIGATAM
## 1931                              KRAFT FOODS
## 1932                             GRUPO GAMESA
## 1933                              GRUPO BIMBO
## 1934                              GRUPO BIMBO
## 1935             JUGOS DEL VALLE S.A. DE C.V.
## 1936                      PEPSI-COLA MEXICANA
## 1937             JUGOS DEL VALLE S.A. DE C.V.
## 1938               FABRICA DE JABON LA CORONA
## 1939                              GRUPO BIMBO
## 1940                              GRUPO BIMBO
## 1941                                 SABRITAS
## 1942                              GRUPO BIMBO
## 1943                      PEPSI-COLA MEXICANA
## 1944         NACIONAL  DE ALIMENTOS Y HELADOS
## 1945                                 SABRITAS
## 1946                                 SABRITAS
## 1947                                 SABRITAS
## 1948                                 SABRITAS
## 1949                      PEPSI-COLA MEXICANA
## 1950                            CADBURY ADAMS
## 1951                    GRUPO INDUSTRIAL LALA
## 1952                              GRUPO BIMBO
## 1953                                COCA COLA
## 1954                      PEPSI-COLA MEXICANA
## 1955                BOTANAS LEO, S.A. DE C.V.
## 1956                      PEPSI-COLA MEXICANA
## 1957                BOTANAS LEO, S.A. DE C.V.
## 1958                      PEPSI-COLA MEXICANA
## 1959                                  CIGATAM
## 1960                                COCA COLA
## 1961                                COCA COLA
## 1962         NACIONAL  DE ALIMENTOS Y HELADOS
## 1963         NACIONAL  DE ALIMENTOS Y HELADOS
## 1964                                 SABRITAS
## 1965                                   BARCEL
## 1966                                 SABRITAS
## 1967                           BOTANAS BOGO´S
## 1968                                 SABRITAS
## 1969                      PEPSI-COLA MEXICANA
## 1970                      PEPSI-COLA MEXICANA
## 1971                          CIA. TOPO CHICO
## 1972                              GRUPO BIMBO
## 1973                         DANONE DE MEXICO
## 1974                                CONFICORP
## 1975                         DANONE DE MEXICO
## 1976                      PEPSI-COLA MEXICANA
## 1977                             GRUPO GAMESA
## 1978                              GRUPO BIMBO
## 1979                    GRUPO INDUSTRIAL LALA
## 1980                                COCA COLA
## 1981         NACIONAL  DE ALIMENTOS Y HELADOS
## 1982                    GRUPO INDUSTRIAL LALA
## 1983                         DANONE DE MEXICO
## 1984                                 SABRITAS
## 1985                      PEPSI-COLA MEXICANA
## 1986                              GRUPO BIMBO
## 1987                                  KURUMBA
## 1988            SANTA CLARA PRODUCTOS LACTEOS
## 1989                         DANONE DE MEXICO
## 1990                         DANONE DE MEXICO
## 1991                      PEPSI-COLA MEXICANA
## 1992                                COCA COLA
## 1993                      PEPSI-COLA MEXICANA
## 1994                          VELADORA MEXICO
## 1995                    GRUPO INDUSTRIAL LALA
## 1996                                  FERRERO
## 1997                                     ALEN
## 1998                                  CIGATAM
## 1999                              GRUPO BIMBO
## 2000                                COCA COLA
## 2001                    GRUPO INDUSTRIAL LALA
## 2002                           GRUPO PEÑAFIEL
## 2003                                     LINK
## 2004                                COCA COLA
## 2005                                  FERRERO
## 2006                              GRUPO BIMBO
## 2007                    GRUPO INDUSTRIAL LALA
## 2008                       EMPACADORA JIMENEZ
## 2009         NACIONAL  DE ALIMENTOS Y HELADOS
## 2010                                COCA COLA
## 2011                                COCA COLA
## 2012                          CIA. TOPO CHICO
## 2013                      PEPSI-COLA MEXICANA
## 2014                                 SABRITAS
## 2015                                 SABRITAS
## 2016                       EMPACADORA JIMENEZ
## 2017                                COCA COLA
## 2018                                COCA COLA
## 2019                 PROCTER & GAMBLE COMPANY
## 2020                                     ALEN
## 2021                 PROCTER & GAMBLE COMPANY
## 2022                       EMPACADORA JIMENEZ
## 2023                      PEPSI-COLA MEXICANA
## 2024                                COCA COLA
## 2025                      PEPSI-COLA MEXICANA
## 2026                                COCA COLA
## 2027                                COCA COLA
## 2028                                 SABRITAS
## 2029                                  MEXILAC
## 2030                                 SABRITAS
## 2031                              GRUPO BIMBO
## 2032                    GRUPO INDUSTRIAL LALA
## 2033                      PEPSI-COLA MEXICANA
## 2034                             GRUPO GAMESA
## 2035                             GRUPO GAMESA
## 2036                    GRUPO INDUSTRIAL LALA
## 2037                                COCA COLA
## 2038                        COLGATE PALMOLIVE
## 2039                                   ACT II
## 2040                                 SABRITAS
## 2041                    GRUPO INDUSTRIAL LALA
## 2042                          CIA. TOPO CHICO
## 2043                                COCA COLA
## 2044          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 2045                                 SABRITAS
## 2046                      PEPSI-COLA MEXICANA
## 2047                      PEPSI-COLA MEXICANA
## 2048                      PEPSI-COLA MEXICANA
## 2049                                COCA COLA
## 2050                                   HERDEZ
## 2051                      ABSORMEX S.A DE C.V
## 2052                      PEPSI-COLA MEXICANA
## 2053                           KIMBERLY CLARK
## 2054                      PEPSI-COLA MEXICANA
## 2055                      PEPSI-COLA MEXICANA
## 2056                      PEPSI-COLA MEXICANA
## 2057                    GRUPO INDUSTRIAL LALA
## 2058                    GRUPO INDUSTRIAL LALA
## 2059                    GRUPO INDUSTRIAL LALA
## 2060                      PEPSI-COLA MEXICANA
## 2061                                COCA COLA
## 2062                                COCA COLA
## 2063                                COCA COLA
## 2064                      PEPSI-COLA MEXICANA
## 2065                      PEPSI-COLA MEXICANA
## 2066                     GILLETTE MANUFACTURA
## 2067                              GRUPO BIMBO
## 2068                              GRUPO BIMBO
## 2069                          CIA. TOPO CHICO
## 2070                                 QUALAMEX
## 2071                      PEPSI-COLA MEXICANA
## 2072                                   NESTLE
## 2073                      PEPSI-COLA MEXICANA
## 2074                                     LINK
## 2075                      PEPSI-COLA MEXICANA
## 2076                                COCA COLA
## 2077                        KELLOGG DE MEXICO
## 2078                                COCA COLA
## 2079                    GRUPO INDUSTRIAL LALA
## 2080                                     ALEN
## 2081                                     ALEN
## 2082                              GRUPO BIMBO
## 2083                      PEPSI-COLA MEXICANA
## 2084                      PEPSI-COLA MEXICANA
## 2085                                  CIGATAM
## 2086                                COCA COLA
## 2087                                COCA COLA
## 2088                              KRAFT FOODS
## 2089                      PEPSI-COLA MEXICANA
## 2090                      PEPSI-COLA MEXICANA
## 2091                          CIA. TOPO CHICO
## 2092                      PEPSI-COLA MEXICANA
## 2093                      PEPSI-COLA MEXICANA
## 2094                                  MEXILAC
## 2095                                COCA COLA
## 2096                                COCA COLA
## 2097                                     LINK
## 2098                                  MEXILAC
## 2099                      PEPSI-COLA MEXICANA
## 2100                      PEPSI-COLA MEXICANA
## 2101                         DANONE DE MEXICO
## 2102               FABRICA DE JABON LA CORONA
## 2103                                COCA COLA
## 2104                                 SABRITAS
## 2105                                COCA COLA
## 2106                                COCA COLA
## 2107                           SCA CONSUMIDOR
## 2108                      PEPSI-COLA MEXICANA
## 2109                                COCA COLA
## 2110                      PEPSI-COLA MEXICANA
## 2111                                  MEXILAC
## 2112                             GRUPO GAMESA
## 2113                                COCA COLA
## 2114                           GRUPO PEÑAFIEL
## 2115                                COCA COLA
## 2116                                COCA COLA
## 2117                                COCA COLA
## 2118                               LA CENTRAL
## 2119                                     ALEN
## 2120                                     ALEN
## 2121                                     ALEN
## 2122               FABRICA DE JABON LA CORONA
## 2123                                 QUALAMEX
## 2124                                    JUMEX
## 2125                                 QUALAMEX
## 2126                                COCA COLA
## 2127                    GRUPO INDUSTRIAL LALA
## 2128                 PROCTER & GAMBLE COMPANY
## 2129                       UNILEVER DE MEXICO
## 2130                      PEPSI-COLA MEXICANA
## 2131                                 SABRITAS
## 2132                                 SABRITAS
## 2133                    GRUPO INDUSTRIAL LALA
## 2134                    GRUPO INDUSTRIAL LALA
## 2135                      PEPSI-COLA MEXICANA
## 2136                                COCA COLA
## 2137                      PEPSI-COLA MEXICANA
## 2138                                 SABRITAS
## 2139                                COCA COLA
## 2140                                COCA COLA
## 2141                                 SABORMEX
## 2142                                COCA COLA
## 2143                      PEPSI-COLA MEXICANA
## 2144                                COCA COLA
## 2145                                  FERRERO
## 2146                              GRUPO BIMBO
## 2147                           HERSHEY MEXICO
## 2148            SANTA CLARA PRODUCTOS LACTEOS
## 2149                      PEPSI-COLA MEXICANA
## 2150                                COCA COLA
## 2151                              GRUPO BIMBO
## 2152                    GRUPO INDUSTRIAL LALA
## 2153                              KRAFT FOODS
## 2154                                     ALEN
## 2155               FABRICA DE JABON LA CORONA
## 2156                                    JUMEX
## 2157                                 SABRITAS
## 2158                                 SABRITAS
## 2159                              GRUPO BIMBO
## 2160                              GRUPO BIMBO
## 2161                                COCA COLA
## 2162                                   NESTLE
## 2163                     ALIMENTOS DEL FUERTE
## 2164                                     LINK
## 2165                    GRUPO INDUSTRIAL LALA
## 2166          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 2167               FABRICA DE JABON LA CORONA
## 2168                    GRUPO INDUSTRIAL LALA
## 2169                      PEPSI-COLA MEXICANA
## 2170                        COLGATE PALMOLIVE
## 2171                      PEPSI-COLA MEXICANA
## 2172                                COCA COLA
## 2173                              GRUPO BIMBO
## 2174                                 SABRITAS
## 2175               FABRICA DE JABON LA CORONA
## 2176                        ALIMENTOS CAPULLO
## 2177                                COCA COLA
## 2178                      PEPSI-COLA MEXICANA
## 2179                                   AJEMEX
## 2180                    GRUPO INDUSTRIAL LALA
## 2181                                   ACT II
## 2182                 PROCTER & GAMBLE COMPANY
## 2183                                 SABRITAS
## 2184                                COCA COLA
## 2185                                   NESTLE
## 2186                              GRUPO BIMBO
## 2187                                COCA COLA
## 2188                          CIA. TOPO CHICO
## 2189                      PEPSI-COLA MEXICANA
## 2190                                  FERRERO
## 2191               FABRICA DE JABON LA CORONA
## 2192                      PEPSI-COLA MEXICANA
## 2193                                  MEXILAC
## 2194             JUGOS DEL VALLE S.A. DE C.V.
## 2195                                    REXAL
## 2196                                   NESTLE
## 2197                                COCA COLA
## 2198                                COCA COLA
## 2199                    GRUPO INDUSTRIAL LALA
## 2200       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 2201                      PEPSI-COLA MEXICANA
## 2202                     GILLETTE MANUFACTURA
## 2203                                   NEVADA
## 2204                      PEPSI-COLA MEXICANA
## 2205                      PEPSI-COLA MEXICANA
## 2206                                 SABRITAS
## 2207                                 SABRITAS
## 2208                                COCA COLA
## 2209                                COCA COLA
## 2210                      PEPSI-COLA MEXICANA
## 2211                                     ALEN
## 2212                                  MEXILAC
## 2213                                     ALEN
## 2214                      PEPSI-COLA MEXICANA
## 2215                      PEPSI-COLA MEXICANA
## 2216                                COCA COLA
## 2217                CONVERTIDORA DE PLASTICOS
## 2218                                COCA COLA
## 2219                                COCA COLA
## 2220                                COCA COLA
## 2221                CONVERTIDORA DE PLASTICOS
## 2222                      PEPSI-COLA MEXICANA
## 2223                      PEPSI-COLA MEXICANA
## 2224                                COCA COLA
## 2225                                COCA COLA
## 2226                              GRUPO BIMBO
## 2227                      PEPSI-COLA MEXICANA
## 2228                          SIGMA ALIMENTOS
## 2229                                 SABRITAS
## 2230                                 SABRITAS
## 2231                                 SABRITAS
## 2232                       UNILEVER DE MEXICO
## 2233                                 SABRITAS
## 2234                      PEPSI-COLA MEXICANA
## 2235                     CONAGRA FOODS MEXICO
## 2236                          CIA. TOPO CHICO
## 2237                                COCA COLA
## 2238             JUGOS DEL VALLE S.A. DE C.V.
## 2239                               LA CENTRAL
## 2240                                COCA COLA
## 2241                                COCA COLA
## 2242         NACIONAL  DE ALIMENTOS Y HELADOS
## 2243                                 SABRITAS
## 2244                      PEPSI-COLA MEXICANA
## 2245                                COCA COLA
## 2246                              GRUPO BIMBO
## 2247                        COLGATE PALMOLIVE
## 2248                                COCA COLA
## 2249                      PEPSI-COLA MEXICANA
## 2250                      ABSORMEX S.A DE C.V
## 2251                                COCA COLA
## 2252                                COCA COLA
## 2253                         MASTER FOODS USA
## 2254                               LA CENTRAL
## 2255                     CONAGRA FOODS MEXICO
## 2256                                COCA COLA
## 2257                                COCA COLA
## 2258                         MASTER FOODS USA
## 2259               ACEITES GRASAS Y DERIVADOS
## 2260                         DANONE DE MEXICO
## 2261                BOTANAS LEO, S.A. DE C.V.
## 2262                     CONSERVAS LA COSTEÑA
## 2263                       EMPACADORA JIMENEZ
## 2264                                 MARUCHAN
## 2265                           GRUPO PEÑAFIEL
## 2266                                 SABORMEX
## 2267                          SALES DEL ISTMO
## 2268                                   HERDEZ
## 2269                                   NESTLE
## 2270                                  FERRERO
## 2271                CONVERTIDORA DE PLASTICOS
## 2272                          CIA. TOPO CHICO
## 2273                                COCA COLA
## 2274                        PRODUCTOS PREMIER
## 2275                                COCA COLA
## 2276                              GRUPO BIMBO
## 2277                     CONAGRA FOODS MEXICO
## 2278                          SIGMA ALIMENTOS
## 2279                                  MEXILAC
## 2280                                COCA COLA
## 2281                      PEPSI-COLA MEXICANA
## 2282                             GRUPO GAMESA
## 2283                              GRUPO BIMBO
## 2284                      PEPSI-COLA MEXICANA
## 2285                                COCA COLA
## 2286                                  CIGATAM
## 2287                      PEPSI-COLA MEXICANA
## 2288                                     ALEN
## 2289                        ALIMENTOS CAPULLO
## 2290                                COCA COLA
## 2291                                 SABRITAS
## 2292                                 SABRITAS
## 2293                                COCA COLA
## 2294                                COCA COLA
## 2295                      PEPSI-COLA MEXICANA
## 2296             JUGOS DEL VALLE S.A. DE C.V.
## 2297                      PEPSI-COLA MEXICANA
## 2298                CONVERTIDORA DE PLASTICOS
## 2299                CONVERTIDORA DE PLASTICOS
## 2300                                     ALEN
## 2301                                     ALEN
## 2302             JUGOS DEL VALLE S.A. DE C.V.
## 2303                          SIGMA ALIMENTOS
## 2304                              GRUPO BIMBO
## 2305                                COCA COLA
## 2306                                COCA COLA
## 2307                     BRISTOL-MYERS SQUIBB
## 2308                        COLGATE PALMOLIVE
## 2309                                  CIGATAM
## 2310                        COLGATE PALMOLIVE
## 2311                      PEPSI-COLA MEXICANA
## 2312                              GRUPO BIMBO
## 2313                                COCA COLA
## 2314                                 SABRITAS
## 2315                                 SABRITAS
## 2316                    GRUPO INDUSTRIAL LALA
## 2317                              GRUPO BIMBO
## 2318                                 SABRITAS
## 2319                     ALIMENTOS DEL FUERTE
## 2320               TOSTADAS Y BOTANAS PREMIUM
## 2321                                 LIQUIMEX
## 2322                                COCA COLA
## 2323       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 2324                                 MARUCHAN
## 2325                                COCA COLA
## 2326                                    JUMEX
## 2327                              KRAFT FOODS
## 2328                      PEPSI-COLA MEXICANA
## 2329                                COCA COLA
## 2330                                COCA COLA
## 2331                              GRUPO BIMBO
## 2332                      PEPSI-COLA MEXICANA
## 2333                         MASTER FOODS USA
## 2334                                 MARUCHAN
## 2335                                 SABRITAS
## 2336         NACIONAL  DE ALIMENTOS Y HELADOS
## 2337                                 SABRITAS
## 2338             JUGOS DEL VALLE S.A. DE C.V.
## 2339                      PEPSI-COLA MEXICANA
## 2340                                    JUMEX
## 2341                      PEPSI-COLA MEXICANA
## 2342                CONVERTIDORA DE PLASTICOS
## 2343                CONVERTIDORA DE PLASTICOS
## 2344 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 2345                                 SABRITAS
## 2346                                COCA COLA
## 2347                      PEPSI-COLA MEXICANA
## 2348                                 LIQUIMEX
## 2349                                COCA COLA
## 2350                          CIA. TOPO CHICO
## 2351                          SIGMA ALIMENTOS
## 2352                                COCA COLA
## 2353                           MEGA ALIMENTOS
## 2354                                COCA COLA
## 2355                             GRUPO GAMESA
## 2356                      PEPSI-COLA MEXICANA
## 2357                                  FERRERO
## 2358                                 SABRITAS
## 2359                                COCA COLA
## 2360                           KIMBERLY CLARK
## 2361                                COCA COLA
## 2362                                 SABRITAS
## 2363                    GRUPO INDUSTRIAL LALA
## 2364                                 SABRITAS
## 2365                                 SABRITAS
## 2366                                 SABRITAS
## 2367                                COCA COLA
## 2368          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 2369                                   NESTLE
## 2370                      PEPSI-COLA MEXICANA
## 2371                          CIA. TOPO CHICO
## 2372                                 SABRITAS
## 2373                                    JUMEX
## 2374                    GRUPO INDUSTRIAL LALA
## 2375                          SIGMA ALIMENTOS
## 2376                          SIGMA ALIMENTOS
## 2377                                 SABRITAS
## 2378                      PEPSI-COLA MEXICANA
## 2379                          CIA. TOPO CHICO
## 2380                                   AJEMEX
## 2381                                 SABRITAS
## 2382                      PEPSI-COLA MEXICANA
## 2383               ACEITES GRASAS Y DERIVADOS
## 2384               FABRICA DE JABON LA CORONA
## 2385                              GRUPO BIMBO
## 2386                                 SABRITAS
## 2387                              GRUPO BIMBO
## 2388                              GRUPO BIMBO
## 2389                              GRUPO BIMBO
## 2390                          SIGMA ALIMENTOS
## 2391                                COCA COLA
## 2392                                     LINK
## 2393                           GRUPO PEÑAFIEL
## 2394                                  CIGATAM
## 2395                                 SABRITAS
## 2396                                COCA COLA
## 2397                                COCA COLA
## 2398                                COCA COLA
## 2399                                 MARUCHAN
## 2400                                 MARUCHAN
## 2401                              GRUPO BIMBO
## 2402                                  CIGATAM
## 2403                                COCA COLA
## 2404                                 SABRITAS
## 2405                                 SABRITAS
## 2406                                 SABORMEX
## 2407                                COCA COLA
## 2408                                   HERDEZ
## 2409                      PEPSI-COLA MEXICANA
## 2410                                 SABRITAS
## 2411                                 SABRITAS
## 2412                      PEPSI-COLA MEXICANA
## 2413                                 SABRITAS
## 2414                                 MARUCHAN
## 2415                                COCA COLA
## 2416                                 SABRITAS
## 2417                                 SABRITAS
## 2418                                 SABRITAS
## 2419                                 SABRITAS
## 2420                              GRUPO BIMBO
## 2421                                     LALA
## 2422                                COCA COLA
## 2423         NACIONAL  DE ALIMENTOS Y HELADOS
## 2424                            CADBURY ADAMS
## 2425                      PEPSI-COLA MEXICANA
## 2426                                   BARCEL
## 2427                                COCA COLA
## 2428           FABRICA DE PAPEL SAN FRANCISCO
## 2429                              GRUPO BIMBO
## 2430                    GRUPO INDUSTRIAL LALA
## 2431                      PEPSI-COLA MEXICANA
## 2432                      PEPSI-COLA MEXICANA
## 2433                      PEPSI-COLA MEXICANA
## 2434                      PEPSI-COLA MEXICANA
## 2435                              KRAFT FOODS
## 2436       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 2437                             GRUPO GAMESA
## 2438                            CADBURY ADAMS
## 2439                                COCA COLA
## 2440                                   NESTLE
## 2441                                    AVANT
## 2442                                 SABRITAS
## 2443                    GRUPO INDUSTRIAL LALA
## 2444         NACIONAL  DE ALIMENTOS Y HELADOS
## 2445                                 SABRITAS
## 2446                                    REXAL
## 2447                      PEPSI-COLA MEXICANA
## 2448                             GRUPO GAMESA
## 2449                     ALIMENTOS DEL FUERTE
## 2450            SANTA CLARA PRODUCTOS LACTEOS
## 2451                    GRUPO INDUSTRIAL LALA
## 2452                        COLGATE PALMOLIVE
## 2453                       UNILEVER DE MEXICO
## 2454                                   NEVADA
## 2455                      PEPSI-COLA MEXICANA
## 2456                                   NESTLE
## 2457                CONVERTIDORA DE PLASTICOS
## 2458                CONVERTIDORA DE PLASTICOS
## 2459                     BRISTOL-MYERS SQUIBB
## 2460                                   ACT II
## 2461                                 SABRITAS
## 2462                          SIGMA ALIMENTOS
## 2463                                COCA COLA
## 2464                              GRUPO BIMBO
## 2465          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 2466                                  CIGATAM
## 2467                    GRUPO INDUSTRIAL LALA
## 2468                                 SABRITAS
## 2469                      PEPSI-COLA MEXICANA
## 2470                      ABSORMEX S.A DE C.V
## 2471                      PEPSI-COLA MEXICANA
## 2472                                 SABRITAS
## 2473                               EMPACADOS 
## 2474                       EMPACADORA JIMENEZ
## 2475         NACIONAL  DE ALIMENTOS Y HELADOS
## 2476                             GRUPO GAMESA
## 2477                                 SABRITAS
## 2478                                 SABRITAS
## 2479                                COCA COLA
## 2480                                  MEXILAC
## 2481                           BOTANAS BOGO´S
## 2482                                COCA COLA
## 2483                      PEPSI-COLA MEXICANA
## 2484                    GRUPO INDUSTRIAL LALA
## 2485                                 MARUCHAN
## 2486                             GRUPO GAMESA
## 2487                        KELLOGG DE MEXICO
## 2488                    GRUPO INDUSTRIAL LALA
## 2489                                 MARUCHAN
## 2490             JUGOS DEL VALLE S.A. DE C.V.
## 2491                                  CIGATAM
## 2492         NACIONAL  DE ALIMENTOS Y HELADOS
## 2493                      PEPSI-COLA MEXICANA
## 2494                           SALSA TAMAZULA
## 2495                                COCA COLA
## 2496             JUGOS DEL VALLE S.A. DE C.V.
## 2497                              GRUPO BIMBO
## 2498                    GRUPO INDUSTRIAL LALA
## 2499                        COLGATE PALMOLIVE
## 2500                    GRUPO INDUSTRIAL LALA
## 2501                      PEPSI-COLA MEXICANA
## 2502                    GRUPO INDUSTRIAL LALA
## 2503             JUGOS DEL VALLE S.A. DE C.V.
## 2504                      PEPSI-COLA MEXICANA
## 2505                      PEPSI-COLA MEXICANA
## 2506                                COCA COLA
## 2507         NACIONAL  DE ALIMENTOS Y HELADOS
## 2508                                 SABRITAS
## 2509                                 SABRITAS
## 2510                                 MARUCHAN
## 2511         NACIONAL  DE ALIMENTOS Y HELADOS
## 2512                                 SABRITAS
## 2513                                COCA COLA
## 2514                                 SABRITAS
## 2515                          CIA. TOPO CHICO
## 2516                                 QUALAMEX
## 2517                          VELADORA MEXICO
## 2518                          VELADORA MEXICO
## 2519                                COCA COLA
## 2520                    GRUPO INDUSTRIAL LALA
## 2521                                COCA COLA
## 2522                    GRUPO INDUSTRIAL LALA
## 2523                                  CIGATAM
## 2524                      PEPSI-COLA MEXICANA
## 2525                      PEPSI-COLA MEXICANA
## 2526                      PEPSI-COLA MEXICANA
## 2527                      PEPSI-COLA MEXICANA
## 2528                      PEPSI-COLA MEXICANA
## 2529                                COCA COLA
## 2530                                COCA COLA
## 2531                              GRUPO BIMBO
## 2532                                  CIGATAM
## 2533                      PEPSI-COLA MEXICANA
## 2534               ACEITES GRASAS Y DERIVADOS
## 2535                              GRUPO BIMBO
## 2536                         PRODUCTOS GERBER
## 2537          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 2538                                COCA COLA
## 2539                    GRUPO INDUSTRIAL LALA
## 2540                      PEPSI-COLA MEXICANA
## 2541                      PEPSI-COLA MEXICANA
## 2542                                COCA COLA
## 2543                                COCA COLA
## 2544                                COCA COLA
## 2545                                 SABRITAS
## 2546                                COCA COLA
## 2547                                 SABRITAS
## 2548             JUGOS DEL VALLE S.A. DE C.V.
## 2549                                 SABRITAS
## 2550                              KRAFT FOODS
## 2551                          SIGMA ALIMENTOS
## 2552                              KRAFT FOODS
## 2553                      PEPSI-COLA MEXICANA
## 2554                                 SABRITAS
## 2555                BOTANAS LEO, S.A. DE C.V.
## 2556                             GRUPO GAMESA
## 2557            SANTA CLARA PRODUCTOS LACTEOS
## 2558                          CIA. TOPO CHICO
## 2559          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 2560                                COCA COLA
## 2561 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 2562                              GRUPO BIMBO
## 2563                      PEPSI-COLA MEXICANA
## 2564                 PROCTER & GAMBLE COMPANY
## 2565                                     ALEN
## 2566                                  CIGATAM
## 2567               FABRICA DE JABON LA CORONA
## 2568                                   NESTLE
## 2569                        COLGATE PALMOLIVE
## 2570                                COCA COLA
## 2571                    GRUPO INDUSTRIAL LALA
## 2572                                COCA COLA
## 2573                                     MARS
## 2574                              CASA CUERVO
## 2575                      PEPSI-COLA MEXICANA
## 2576                                COCA COLA
## 2577                     CONAGRA FOODS MEXICO
## 2578                            MARINDUSTRIAS
## 2579             JUGOS DEL VALLE S.A. DE C.V.
## 2580                                     LINK
## 2581                             GRUPO GAMESA
## 2582            SANTA CLARA PRODUCTOS LACTEOS
## 2583                                 SABRITAS
## 2584                                 SABRITAS
## 2585                      PEPSI-COLA MEXICANA
## 2586                             GRUPO GAMESA
## 2587                       GOMEZ CUETARA HNOS
## 2588                        COLGATE PALMOLIVE
## 2589                 PROCTER & GAMBLE COMPANY
## 2590             JUGOS DEL VALLE S.A. DE C.V.
## 2591                      PEPSI-COLA MEXICANA
## 2592                             GRUPO GAMESA
## 2593                              GRUPO BIMBO
## 2594                                    JUMEX
## 2595                        COLGATE PALMOLIVE
## 2596                                COCA COLA
## 2597                                COCA COLA
## 2598                      PEPSI-COLA MEXICANA
## 2599                      PEPSI-COLA MEXICANA
## 2600                        LABORATORIOS PISA
## 2601                        LABORATORIOS PISA
## 2602                          VELADORA MEXICO
## 2603                      PEPSI-COLA MEXICANA
## 2604                                   NESTLE
## 2605                     BRISTOL-MYERS SQUIBB
## 2606                 PROCTER & GAMBLE COMPANY
## 2607                     CONSERVAS LA COSTEÑA
## 2608                          SIGMA ALIMENTOS
## 2609                    GRUPO INDUSTRIAL LALA
## 2610                              GRUPO BIMBO
## 2611                              GRUPO BIMBO
## 2612                                    JUMEX
## 2613                      PEPSI-COLA MEXICANA
## 2614                                 SABRITAS
## 2615                                 SABRITAS
## 2616                       LABORATORIO MONELI
## 2617             JUGOS DEL VALLE S.A. DE C.V.
## 2618                                     ALEN
## 2619                          SIGMA ALIMENTOS
## 2620                       UNILEVER DE MEXICO
## 2621                CONVERTIDORA DE PLASTICOS
## 2622                          SIGMA ALIMENTOS
## 2623                              GRUPO BIMBO
## 2624                                COCA COLA
## 2625                                   AJEMEX
## 2626                      PEPSI-COLA MEXICANA
## 2627                      PEPSI-COLA MEXICANA
## 2628                        COLGATE PALMOLIVE
## 2629                              KRAFT FOODS
## 2630                       GOMEZ CUETARA HNOS
## 2631                      PEPSI-COLA MEXICANA
## 2632                                COCA COLA
## 2633                CONVERTIDORA DE PLASTICOS
## 2634                CONVERTIDORA DE PLASTICOS
## 2635                      PEPSI-COLA MEXICANA
## 2636                                COCA COLA
## 2637                                COCA COLA
## 2638                                     MARS
## 2639         NACIONAL  DE ALIMENTOS Y HELADOS
## 2640             JUGOS DEL VALLE S.A. DE C.V.
## 2641                      PEPSI-COLA MEXICANA
## 2642                          CIA. TOPO CHICO
## 2643                              KRAFT FOODS
## 2644                      PEPSI-COLA MEXICANA
## 2645                                COCA COLA
## 2646                                COCA COLA
## 2647                     CONSERVAS LA COSTEÑA
## 2648                              GRUPO BIMBO
## 2649                              GRUPO BIMBO
## 2650                               LA CENTRAL
## 2651                                 QUALAMEX
## 2652                                COCA COLA
## 2653                      PEPSI-COLA MEXICANA
## 2654               FABRICA DE JABON LA CORONA
## 2655                                     ALEN
## 2656                                 MARUCHAN
## 2657                      PEPSI-COLA MEXICANA
## 2658        PRODUCTOS ALIMENTICIOS LA MODERNA
## 2659                                 MARUCHAN
## 2660                      PEPSI-COLA MEXICANA
## 2661                           SALSA TAMAZULA
## 2662               FABRICA DE JABON LA CORONA
## 2663                              GRUPO BIMBO
## 2664                     CONAGRA FOODS MEXICO
## 2665                                COCA COLA
## 2666                      PEPSI-COLA MEXICANA
## 2667                                  KURUMBA
## 2668                      PEPSI-COLA MEXICANA
## 2669                      PEPSI-COLA MEXICANA
## 2670                                COCA COLA
## 2671       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 2672                           MEGA ALIMENTOS
## 2673                                 SABRITAS
## 2674                        EMPACADORA NORVER
## 2675                      PEPSI-COLA MEXICANA
## 2676                               EMPACADOS 
## 2677                      PEPSI-COLA MEXICANA
## 2678                      PEPSI-COLA MEXICANA
## 2679                      PEPSI-COLA MEXICANA
## 2680                         DANONE DE MEXICO
## 2681                      PEPSI-COLA MEXICANA
## 2682                                COCA COLA
## 2683                              GRUPO BIMBO
## 2684                              GRUPO BIMBO
## 2685                         DANONE DE MEXICO
## 2686                                   NESTLE
## 2687                                   NESTLE
## 2688                              GRUPO BIMBO
## 2689                                  CIGATAM
## 2690                                   NESTLE
## 2691                      PEPSI-COLA MEXICANA
## 2692                         DANONE DE MEXICO
## 2693                              GRUPO BIMBO
## 2694                              GRUPO BIMBO
## 2695                     CONSERVAS LA COSTEÑA
## 2696                     ALIMENTOS DEL FUERTE
## 2697                     ALIMENTOS DEL FUERTE
## 2698                      PEPSI-COLA MEXICANA
## 2699                                 SABRITAS
## 2700                                     ALEN
## 2701                                COCA COLA
## 2702                        EMPACADORA NORVER
## 2703                          BUENO ALIMENTOS
## 2704                      PEPSI-COLA MEXICANA
## 2705                                 SABRITAS
## 2706                      PEPSI-COLA MEXICANA
## 2707                      PEPSI-COLA MEXICANA
## 2708                                COCA COLA
## 2709                                 SABRITAS
## 2710                CONVERTIDORA DE PLASTICOS
## 2711                CONVERTIDORA DE PLASTICOS
## 2712                      PEPSI-COLA MEXICANA
## 2713                                  CIGATAM
## 2714                                  CIGATAM
## 2715                     CONAGRA FOODS MEXICO
## 2716                                COCA COLA
## 2717                                 SABRITAS
## 2718                                 SABRITAS
## 2719                                    JUMEX
## 2720                               EMPACADOS 
## 2721                                 SABRITAS
## 2722                             GRUPO GAMESA
## 2723                      PEPSI-COLA MEXICANA
## 2724   IMPORTACIONES HNOS. CANTú S.A. DE C.V.
## 2725                                 SABRITAS
## 2726                           INDUSTRIAS H24
## 2727                      PEPSI-COLA MEXICANA
## 2728                                COCA COLA
## 2729         NACIONAL  DE ALIMENTOS Y HELADOS
## 2730                        COLGATE PALMOLIVE
## 2731                           KIMBERLY CLARK
## 2732                        PRODUCTOS PREMIER
## 2733                                     ALEN
## 2734                              GRUPO BIMBO
## 2735                          SIGMA ALIMENTOS
## 2736                              GRUPO BIMBO
## 2737                          SIGMA ALIMENTOS
## 2738                BOTANAS LEO, S.A. DE C.V.
## 2739                                COCA COLA
## 2740                          CIA. TOPO CHICO
## 2741                                COCA COLA
## 2742       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 2743               TOSTADAS Y BOTANAS PREMIUM
## 2744                                 SABRITAS
## 2745                      PEPSI-COLA MEXICANA
## 2746                                     LINK
## 2747                                COCA COLA
## 2748                                 SABRITAS
## 2749                           MEGA ALIMENTOS
## 2750                      PEPSI-COLA MEXICANA
## 2751                      PEPSI-COLA MEXICANA
## 2752                              KRAFT FOODS
## 2753                                COCA COLA
## 2754                              KRAFT FOODS
## 2755                              KRAFT FOODS
## 2756                          SALES DEL ISTMO
## 2757                             GRUPO GAMESA
## 2758                      PEPSI-COLA MEXICANA
## 2759             JUGOS DEL VALLE S.A. DE C.V.
## 2760                              GRUPO BIMBO
## 2761                      PEPSI-COLA MEXICANA
## 2762                                COCA COLA
## 2763                                COCA COLA
## 2764                           SCA CONSUMIDOR
## 2765                    GRUPO INDUSTRIAL LALA
## 2766                                COCA COLA
## 2767                   GRUPO CHI-SO S DE RLMI
## 2768                       UNILEVER DE MEXICO
## 2769                      PEPSI-COLA MEXICANA
## 2770                          CIA. TOPO CHICO
## 2771                                 SABRITAS
## 2772                                  CIGATAM
## 2773                          SIGMA ALIMENTOS
## 2774                                   NESTLE
## 2775                      PEPSI-COLA MEXICANA
## 2776                     ALIMENTOS DEL FUERTE
## 2777                     ALIMENTOS DEL FUERTE
## 2778                      PEPSI-COLA MEXICANA
## 2779                      PEPSI-COLA MEXICANA
## 2780                                COCA COLA
## 2781                      PEPSI-COLA MEXICANA
## 2782                                COCA COLA
## 2783                              GRUPO BIMBO
## 2784                      PEPSI-COLA MEXICANA
## 2785                      PEPSI-COLA MEXICANA
## 2786                              GRUPO BIMBO
## 2787                                  CIGATAM
## 2788                                 SABRITAS
## 2789                                 SABRITAS
## 2790                         DANONE DE MEXICO
## 2791                                COCA COLA
## 2792                        COLGATE PALMOLIVE
## 2793                 PROCTER & GAMBLE COMPANY
## 2794                                  KURUMBA
## 2795                      PEPSI-COLA MEXICANA
## 2796                              GRUPO BIMBO
## 2797                      PEPSI-COLA MEXICANA
## 2798                CONVERTIDORA DE PLASTICOS
## 2799                                COCA COLA
## 2800                                COCA COLA
## 2801                                COCA COLA
## 2802                         DANONE DE MEXICO
## 2803                      PEPSI-COLA MEXICANA
## 2804                      PEPSI-COLA MEXICANA
## 2805                     ALIMENTOS DEL FUERTE
## 2806             JUGOS DEL VALLE S.A. DE C.V.
## 2807                          CIA. TOPO CHICO
## 2808                          CIA. TOPO CHICO
## 2809                      PEPSI-COLA MEXICANA
## 2810                                COCA COLA
## 2811                          SIGMA ALIMENTOS
## 2812                                COCA COLA
## 2813                                COCA COLA
## 2814                              GRUPO BIMBO
## 2815                      PEPSI-COLA MEXICANA
## 2816                          CIA. TOPO CHICO
## 2817          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 2818                      PEPSI-COLA MEXICANA
## 2819                      PEPSI-COLA MEXICANA
## 2820                          SIGMA ALIMENTOS
## 2821                             GRUPO GAMESA
## 2822                         DANONE DE MEXICO
## 2823                      PEPSI-COLA MEXICANA
## 2824                    GRUPO INDUSTRIAL LALA
## 2825                                 SABRITAS
## 2826                              GRUPO BIMBO
## 2827                    GRUPO INDUSTRIAL LALA
## 2828                                COCA COLA
## 2829                                COCA COLA
## 2830                                COCA COLA
## 2831                          SIGMA ALIMENTOS
## 2832                                COCA COLA
## 2833                           CASA HERRADURA
## 2834                     CONSERVAS LA COSTEÑA
## 2835                      PEPSI-COLA MEXICANA
## 2836       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 2837                              GRUPO BIMBO
## 2838                      PEPSI-COLA MEXICANA
## 2839               TOSTADAS Y BOTANAS PREMIUM
## 2840                                COCA COLA
## 2841                     BRISTOL-MYERS SQUIBB
## 2842                          SIGMA ALIMENTOS
## 2843                              GRUPO BIMBO
## 2844                              GRUPO BIMBO
## 2845         NACIONAL  DE ALIMENTOS Y HELADOS
## 2846                      PEPSI-COLA MEXICANA
## 2847                              GRUPO BIMBO
## 2848                          SIGMA ALIMENTOS
## 2849                      PEPSI-COLA MEXICANA
## 2850                      PEPSI-COLA MEXICANA
## 2851                     CONAGRA FOODS MEXICO
## 2852                      PEPSI-COLA MEXICANA
## 2853                      PEPSI-COLA MEXICANA
## 2854                                COCA COLA
## 2855                                COCA COLA
## 2856                      PEPSI-COLA MEXICANA
## 2857                                COCA COLA
## 2858                               LA CENTRAL
## 2859                                COCA COLA
## 2860                                COCA COLA
## 2861                                COCA COLA
## 2862                      PEPSI-COLA MEXICANA
## 2863             JUGOS DEL VALLE S.A. DE C.V.
## 2864                      PEPSI-COLA MEXICANA
## 2865                      PEPSI-COLA MEXICANA
## 2866                      PEPSI-COLA MEXICANA
## 2867                        COLGATE PALMOLIVE
## 2868                      PEPSI-COLA MEXICANA
## 2869                        ALIMENTOS CAPULLO
## 2870                            CADBURY ADAMS
## 2871                             GRUPO GAMESA
## 2872                     CONSERVAS LA COSTEÑA
## 2873                          SIGMA ALIMENTOS
## 2874                      PEPSI-COLA MEXICANA
## 2875                              GRUPO BIMBO
## 2876                      PEPSI-COLA MEXICANA
## 2877                                 SABRITAS
## 2878                      PEPSI-COLA MEXICANA
## 2879                                  KURUMBA
## 2880                              GRUPO BIMBO
## 2881                                   NESTLE
## 2882                                 SABRITAS
## 2883                                 SABRITAS
## 2884                                 SABRITAS
## 2885                      PEPSI-COLA MEXICANA
## 2886                                COCA COLA
## 2887                           BOTANAS BOGO´S
## 2888                                  MEXILAC
## 2889                              GRUPO BIMBO
## 2890                          SIGMA ALIMENTOS
## 2891                CONVERTIDORA DE PLASTICOS
## 2892                CONVERTIDORA DE PLASTICOS
## 2893                             GRUPO GAMESA
## 2894                                 SABRITAS
## 2895             JUGOS DEL VALLE S.A. DE C.V.
## 2896                              GRUPO BIMBO
## 2897                      PEPSI-COLA MEXICANA
## 2898                                  CIGATAM
## 2899                      PEPSI-COLA MEXICANA
## 2900                                   ACT II
## 2901                             GRUPO GAMESA
## 2902                             GRUPO GAMESA
## 2903                      PEPSI-COLA MEXICANA
## 2904                                 SABRITAS
## 2905                                 SABRITAS
## 2906                      PEPSI-COLA MEXICANA
## 2907                                     MARS
## 2908                                   NEVADA
## 2909                      PEPSI-COLA MEXICANA
## 2910 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 2911                                 SABRITAS
## 2912                                   HERDEZ
## 2913                                 SABRITAS
## 2914                                 SABRITAS
## 2915                                 SABRITAS
## 2916             JUGOS DEL VALLE S.A. DE C.V.
## 2917                        EMPACADORA NORVER
## 2918               TOSTADAS Y BOTANAS PREMIUM
## 2919                                 SABRITAS
## 2920                             GRUPO GAMESA
## 2921                                 SABRITAS
## 2922                      PEPSI-COLA MEXICANA
## 2923                                    JUMEX
## 2924                                 SABRITAS
## 2925                                COCA COLA
## 2926                                 QUALAMEX
## 2927                              GRUPO BIMBO
## 2928                               LA CENTRAL
## 2929                      PEPSI-COLA MEXICANA
## 2930                                COCA COLA
## 2931                                COCA COLA
## 2932                                 MARUCHAN
## 2933                                 SABRITAS
## 2934         NACIONAL  DE ALIMENTOS Y HELADOS
## 2935                      PEPSI-COLA MEXICANA
## 2936                     CONSERVAS LA COSTEÑA
## 2937                              KRAFT FOODS
## 2938                                 QUALAMEX
## 2939                                 QUALAMEX
## 2940                                     LINK
## 2941                      PEPSI-COLA MEXICANA
## 2942                                  CIGATAM
## 2943                                COCA COLA
## 2944                                COCA COLA
## 2945                      PEPSI-COLA MEXICANA
## 2946                      PEPSI-COLA MEXICANA
## 2947                     ALIMENTOS DEL FUERTE
## 2948                                  CIGATAM
## 2949                      PEPSI-COLA MEXICANA
## 2950                    GRUPO INDUSTRIAL LALA
## 2951                             GRUPO GAMESA
## 2952                             GRUPO GAMESA
## 2953                                 SABRITAS
## 2954                          SIGMA ALIMENTOS
## 2955                          SIGMA ALIMENTOS
## 2956                          CIA. TOPO CHICO
## 2957                                 SABRITAS
## 2958                     ALIMENTOS DEL FUERTE
## 2959                      PEPSI-COLA MEXICANA
## 2960                                 SABRITAS
## 2961                      PEPSI-COLA MEXICANA
## 2962                                 SABRITAS
## 2963                         DANONE DE MEXICO
## 2964                         DANONE DE MEXICO
## 2965                                 SABRITAS
## 2966                                COCA COLA
## 2967                                 SABRITAS
## 2968                                  MEXILAC
## 2969                           MEGA ALIMENTOS
## 2970                                   ACT II
## 2971                                 SABRITAS
## 2972         NACIONAL  DE ALIMENTOS Y HELADOS
## 2973                       LABORATORIO MONELI
## 2974                                COCA COLA
## 2975                    GRUPO INDUSTRIAL LALA
## 2976                          SIGMA ALIMENTOS
## 2977                      PEPSI-COLA MEXICANA
## 2978                                COCA COLA
## 2979                      PEPSI-COLA MEXICANA
## 2980                              KRAFT FOODS
## 2981                         DANONE DE MEXICO
## 2982                         DANONE DE MEXICO
## 2983                                  SONRICS
## 2984                      PEPSI-COLA MEXICANA
## 2985                         DANONE DE MEXICO
## 2986                                COCA COLA
## 2987                                 SABRITAS
## 2988                                COCA COLA
## 2989                                COCA COLA
## 2990 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 2991                      PEPSI-COLA MEXICANA
## 2992                             GRUPO GAMESA
## 2993                                   NESTLE
## 2994                                  CIGATAM
## 2995                          SIGMA ALIMENTOS
## 2996                     CONAGRA FOODS MEXICO
## 2997                                COCA COLA
## 2998                              GRUPO BIMBO
## 2999                              GRUPO BIMBO
## 3000                    GRUPO INDUSTRIAL LALA
## 3001                      PEPSI-COLA MEXICANA
## 3002               FABRICA DE JABON LA CORONA
## 3003                 PROCTER & GAMBLE COMPANY
## 3004                                COCA COLA
## 3005         NACIONAL  DE ALIMENTOS Y HELADOS
## 3006                                 SABRITAS
## 3007                    GRUPO INDUSTRIAL LALA
## 3008                               EMPACADOS 
## 3009                          CIA. TOPO CHICO
## 3010                          VELADORA MEXICO
## 3011                              GRUPO BIMBO
## 3012                              GRUPO BIMBO
## 3013                      PEPSI-COLA MEXICANA
## 3014          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 3015                              GRUPO BIMBO
## 3016                              GRUPO BIMBO
## 3017                                 SABRITAS
## 3018                      PEPSI-COLA MEXICANA
## 3019                                COCA COLA
## 3020                         DANONE DE MEXICO
## 3021                      PEPSI-COLA MEXICANA
## 3022                          SIGMA ALIMENTOS
## 3023                PESCADOS INDUSTRIALIZADOS
## 3024                                     LINK
## 3025                                COCA COLA
## 3026                                  CIGATAM
## 3027                    GRUPO INDUSTRIAL LALA
## 3028                              GRUPO BIMBO
## 3029                                COCA COLA
## 3030                                COCA COLA
## 3031                              GRUPO BIMBO
## 3032                                  KURUMBA
## 3033                            CADBURY ADAMS
## 3034                                COCA COLA
## 3035                                  MEXILAC
## 3036                     CONSERVAS LA COSTEÑA
## 3037                           KIMBERLY CLARK
## 3038                          CIA. TOPO CHICO
## 3039                                COCA COLA
## 3040                          CIA. TOPO CHICO
## 3041                      PEPSI-COLA MEXICANA
## 3042                      PEPSI-COLA MEXICANA
## 3043                        COLGATE PALMOLIVE
## 3044                      PEPSI-COLA MEXICANA
## 3045                                  CIGATAM
## 3046                      PEPSI-COLA MEXICANA
## 3047                                   NESTLE
## 3048                        EMPACADORA NORVER
## 3049                              GRUPO BIMBO
## 3050                          SALES DEL ISTMO
## 3051                                 SABRITAS
## 3052                           EFEM DE MEXICO
## 3053                      PEPSI-COLA MEXICANA
## 3054                      PEPSI-COLA MEXICANA
## 3055                                 SABORMEX
## 3056                          SIGMA ALIMENTOS
## 3057                                  CIGATAM
## 3058                      PEPSI-COLA MEXICANA
## 3059                                 SABRITAS
## 3060                                 SABRITAS
## 3061          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 3062                      PEPSI-COLA MEXICANA
## 3063                      PEPSI-COLA MEXICANA
## 3064                          VELADORA MEXICO
## 3065                              GRUPO BIMBO
## 3066                          VELADORA MEXICO
## 3067                                COCA COLA
## 3068                              GRUPO BIMBO
## 3069                                  CIGATAM
## 3070                                 SABRITAS
## 3071                        EMPACADORA NORVER
## 3072                                COCA COLA
## 3073                    GRUPO INDUSTRIAL LALA
## 3074                      PEPSI-COLA MEXICANA
## 3075                                  MEXILAC
## 3076                                COCA COLA
## 3077                    GRUPO INDUSTRIAL LALA
## 3078                      PEPSI-COLA MEXICANA
## 3079                                COCA COLA
## 3080                           EFEM DE MEXICO
## 3081         NACIONAL  DE ALIMENTOS Y HELADOS
## 3082                              GRUPO BIMBO
## 3083                                 SABRITAS
## 3084                              GRUPO BIMBO
## 3085                                COCA COLA
## 3086                      INDUSTRIAS KOLALOKA
## 3087                                 SABRITAS
## 3088                                 SABRITAS
## 3089                BOTANAS LEO, S.A. DE C.V.
## 3090                      PEPSI-COLA MEXICANA
## 3091         NACIONAL  DE ALIMENTOS Y HELADOS
## 3092                      PEPSI-COLA MEXICANA
## 3093                                COCA COLA
## 3094                                COCA COLA
## 3095                      PEPSI-COLA MEXICANA
## 3096                            CADBURY ADAMS
## 3097                                COCA COLA
## 3098                              GRUPO BIMBO
## 3099             JUGOS DEL VALLE S.A. DE C.V.
## 3100                    GRUPO INDUSTRIAL LALA
## 3101                                COCA COLA
## 3102                             GRUPO GAMESA
## 3103                                 SABRITAS
## 3104                                  KURUMBA
## 3105                     GILLETTE MANUFACTURA
## 3106                              GRUPO BIMBO
## 3107             JUGOS DEL VALLE S.A. DE C.V.
## 3108                                 SABRITAS
## 3109                                 SABRITAS
## 3110                                 SABRITAS
## 3111                                 SABRITAS
## 3112                                 SABRITAS
## 3113                                 MARUCHAN
## 3114                      PEPSI-COLA MEXICANA
## 3115                           EFEM DE MEXICO
## 3116                      PEPSI-COLA MEXICANA
## 3117                             GRUPO GAMESA
## 3118                    GRUPO INDUSTRIAL LALA
## 3119                                  CIGATAM
## 3120                             GRUPO GAMESA
## 3121                                  CIGATAM
## 3122                                  CIGATAM
## 3123                                COCA COLA
## 3124                                 SABRITAS
## 3125                                COCA COLA
## 3126         NACIONAL  DE ALIMENTOS Y HELADOS
## 3127                                   ACT II
## 3128                              KRAFT FOODS
## 3129                                 SABRITAS
## 3130                    GRUPO INDUSTRIAL LALA
## 3131                                     LINK
## 3132                              GRUPO BIMBO
## 3133                                 SABRITAS
## 3134                             GRUPO GAMESA
## 3135                              GRUPO BIMBO
## 3136         NACIONAL  DE ALIMENTOS Y HELADOS
## 3137                                 SABRITAS
## 3138                                 SABRITAS
## 3139                    GRUPO INDUSTRIAL LALA
## 3140                      PEPSI-COLA MEXICANA
## 3141                                COCA COLA
## 3142                    GRUPO INDUSTRIAL LALA
## 3143                                COCA COLA
## 3144                      PEPSI-COLA MEXICANA
## 3145                BOTANAS LEO, S.A. DE C.V.
## 3146                                  CIGATAM
## 3147                BOTANAS LEO, S.A. DE C.V.
## 3148                                 SABRITAS
## 3149                                 SABRITAS
## 3150                        RAGASA INDUSTRIAS
## 3151                                   ACT II
## 3152                                 SABRITAS
## 3153                                 SABRITAS
## 3154                    GRUPO INDUSTRIAL LALA
## 3155                                   NESTLE
## 3156                                   HENKEL
## 3157                              GRUPO BIMBO
## 3158                              GRUPO BIMBO
## 3159                            CADBURY ADAMS
## 3160                      PEPSI-COLA MEXICANA
## 3161                              GRUPO BIMBO
## 3162                      PEPSI-COLA MEXICANA
## 3163                              KRAFT FOODS
## 3164                      PEPSI-COLA MEXICANA
## 3165                                COCA COLA
## 3166                              GRUPO BIMBO
## 3167                              GRUPO BIMBO
## 3168                                COCA COLA
## 3169                              GRUPO BIMBO
## 3170                                COCA COLA
## 3171                        COLGATE PALMOLIVE
## 3172                              GRUPO BIMBO
## 3173             JUGOS DEL VALLE S.A. DE C.V.
## 3174         NACIONAL  DE ALIMENTOS Y HELADOS
## 3175                        COLGATE PALMOLIVE
## 3176                CONVERTIDORA DE PLASTICOS
## 3177                      PEPSI-COLA MEXICANA
## 3178                      PEPSI-COLA MEXICANA
## 3179                    GRUPO INDUSTRIAL LALA
## 3180                              GRUPO BIMBO
## 3181                                  MEXILAC
## 3182                                COCA COLA
## 3183                      PEPSI-COLA MEXICANA
## 3184                      PEPSI-COLA MEXICANA
## 3185                             GRUPO GAMESA
## 3186                                  MEXILAC
## 3187                      PEPSI-COLA MEXICANA
## 3188                                  MEXILAC
## 3189                                COCA COLA
## 3190                                     LINK
## 3191                                COCA COLA
## 3192                      PEPSI-COLA MEXICANA
## 3193                                 SABRITAS
## 3194                      PEPSI-COLA MEXICANA
## 3195                         PRODUCTOS GERBER
## 3196                      PEPSI-COLA MEXICANA
## 3197                      PEPSI-COLA MEXICANA
## 3198                                COCA COLA
## 3199                      PEPSI-COLA MEXICANA
## 3200                      INDUSTRIAS KOLALOKA
## 3201                      PEPSI-COLA MEXICANA
## 3202                       EMPACADORA JIMENEZ
## 3203                        COLGATE PALMOLIVE
## 3204                      PEPSI-COLA MEXICANA
## 3205                                     ALEN
## 3206                                  CIGATAM
## 3207                      PEPSI-COLA MEXICANA
## 3208                                  MEXILAC
## 3209                      PEPSI-COLA MEXICANA
## 3210                      PEPSI-COLA MEXICANA
## 3211                                COCA COLA
## 3212                                COCA COLA
## 3213                    GRUPO INDUSTRIAL LALA
## 3214                              GRUPO BIMBO
## 3215                                   NESTLE
## 3216                              KRAFT FOODS
## 3217                                COCA COLA
## 3218                              GRUPO BIMBO
## 3219                      PEPSI-COLA MEXICANA
## 3220                         STAR COMPANY S.A
## 3221               FABRICA DE JABON LA CORONA
## 3222                      PEPSI-COLA MEXICANA
## 3223             JUGOS DEL VALLE S.A. DE C.V.
## 3224                      PEPSI-COLA MEXICANA
## 3225                      PEPSI-COLA MEXICANA
## 3226                      PEPSI-COLA MEXICANA
## 3227                                   NESTLE
## 3228                              GRUPO BIMBO
## 3229                      PEPSI-COLA MEXICANA
## 3230             JUGOS DEL VALLE S.A. DE C.V.
## 3231                                 SABRITAS
## 3232                         DANONE DE MEXICO
## 3233                                COCA COLA
## 3234                                   NEVADA
## 3235                                   HERDEZ
## 3236                                COCA COLA
## 3237                      PEPSI-COLA MEXICANA
## 3238                                 SABRITAS
## 3239                      PEPSI-COLA MEXICANA
## 3240                                COCA COLA
## 3241                             GRUPO GAMESA
## 3242                             GRUPO GAMESA
## 3243                                   HERDEZ
## 3244                      PEPSI-COLA MEXICANA
## 3245                              KRAFT FOODS
## 3246                PESCADOS INDUSTRIALIZADOS
## 3247                               EMPACADOS 
## 3248                              GRUPO BIMBO
## 3249                        COLGATE PALMOLIVE
## 3250                       EMPACADORA JIMENEZ
## 3251                     ALIMENTOS DEL FUERTE
## 3252                          SIGMA ALIMENTOS
## 3253                  Refrescos Pascual, S.A.
## 3254                                COCA COLA
## 3255                              GRUPO BIMBO
## 3256                      PEPSI-COLA MEXICANA
## 3257                      PEPSI-COLA MEXICANA
## 3258               FABRICA DE JABON LA CORONA
## 3259               ACEITES GRASAS Y DERIVADOS
## 3260                    GRUPO INDUSTRIAL LALA
## 3261                                COCA COLA
## 3262                             GRUPO GAMESA
## 3263             JUGOS DEL VALLE S.A. DE C.V.
## 3264             JUGOS DEL VALLE S.A. DE C.V.
## 3265                              KRAFT FOODS
## 3266                                 SABRITAS
## 3267                          SIGMA ALIMENTOS
## 3268                                 MARUCHAN
## 3269                                COCA COLA
## 3270               FABRICA DE JABON LA CORONA
## 3271                                 SABRITAS
## 3272                                 SABRITAS
## 3273                                 SABRITAS
## 3274                                COCA COLA
## 3275               FABRICA DE JABON LA CORONA
## 3276                      PEPSI-COLA MEXICANA
## 3277                                COCA COLA
## 3278                                 SABRITAS
## 3279                BOTANAS LEO, S.A. DE C.V.
## 3280                              KRAFT FOODS
## 3281                                COCA COLA
## 3282                              KRAFT FOODS
## 3283                              GRUPO BIMBO
## 3284                                COCA COLA
## 3285                                COCA COLA
## 3286                        COLGATE PALMOLIVE
## 3287                                 SABRITAS
## 3288                      PEPSI-COLA MEXICANA
## 3289                      PEPSI-COLA MEXICANA
## 3290               TOSTADAS Y BOTANAS PREMIUM
## 3291                                COCA COLA
## 3292                                COCA COLA
## 3293                                COCA COLA
## 3294                              GRUPO BIMBO
## 3295                      PEPSI-COLA MEXICANA
## 3296                                 SABRITAS
## 3297                                COCA COLA
## 3298                                COCA COLA
## 3299                    GRUPO INDUSTRIAL LALA
## 3300                                   NESTLE
## 3301                                  MEXILAC
## 3302                              GRUPO BIMBO
## 3303                    GRUPO INDUSTRIAL LALA
## 3304                              GRUPO BIMBO
## 3305                                COCA COLA
## 3306                                COCA COLA
## 3307                             GRUPO GAMESA
## 3308                BOTANAS LEO, S.A. DE C.V.
## 3309                                COCA COLA
## 3310                         PRODUCTOS GERBER
## 3311                        COLGATE PALMOLIVE
## 3312                      PEPSI-COLA MEXICANA
## 3313                                   NESTLE
## 3314                                    JUMEX
## 3315                                    JUMEX
## 3316                    GRUPO INDUSTRIAL LALA
## 3317                      PEPSI-COLA MEXICANA
## 3318                                     ALEN
## 3319               FABRICA DE JABON LA CORONA
## 3320                             AJEMONTERREY
## 3321                                 SABRITAS
## 3322                                   NESTLE
## 3323                                COCA COLA
## 3324                             GRUPO GAMESA
## 3325                      PEPSI-COLA MEXICANA
## 3326                      PEPSI-COLA MEXICANA
## 3327                                 SABRITAS
## 3328                                 SABRITAS
## 3329                          CIA. TOPO CHICO
## 3330                                 SABRITAS
## 3331                    GRUPO INDUSTRIAL LALA
## 3332                                COCA COLA
## 3333                                 MARUCHAN
## 3334                       GOMEZ CUETARA HNOS
## 3335                                     ALEN
## 3336                              GRUPO BIMBO
## 3337                                 SABRITAS
## 3338                                COCA COLA
## 3339                    GRUPO INDUSTRIAL LALA
## 3340                      PEPSI-COLA MEXICANA
## 3341                                 MARUCHAN
## 3342                      PEPSI-COLA MEXICANA
## 3343                      PEPSI-COLA MEXICANA
## 3344                          SIGMA ALIMENTOS
## 3345                          SIGMA ALIMENTOS
## 3346                    GRUPO INDUSTRIAL LALA
## 3347                          SIGMA ALIMENTOS
## 3348                                COCA COLA
## 3349                      PEPSI-COLA MEXICANA
## 3350                          SIGMA ALIMENTOS
## 3351                      PEPSI-COLA MEXICANA
## 3352                                  FERRERO
## 3353                          VELADORA MEXICO
## 3354                          CIA. TOPO CHICO
## 3355                      PEPSI-COLA MEXICANA
## 3356                                COCA COLA
## 3357                              KRAFT FOODS
## 3358                          SALES DEL ISTMO
## 3359                      PEPSI-COLA MEXICANA
## 3360                      PEPSI-COLA MEXICANA
## 3361                                     LINK
## 3362                                 SABORMEX
## 3363                              GRUPO BIMBO
## 3364                             GRUPO GAMESA
## 3365                                 SABRITAS
## 3366                        COLGATE PALMOLIVE
## 3367         NACIONAL  DE ALIMENTOS Y HELADOS
## 3368                                COCA COLA
## 3369                            CADBURY ADAMS
## 3370                                COCA COLA
## 3371                     EMPACADORA DEL CAMPO
## 3372               TOSTADAS Y BOTANAS PREMIUM
## 3373                                     LINK
## 3374                                COCA COLA
## 3375           FABRICA DE PAPEL SAN FRANCISCO
## 3376                        EMPACADORA NORVER
## 3377             JUGOS DEL VALLE S.A. DE C.V.
## 3378                              GRUPO BIMBO
## 3379                    GRUPO INDUSTRIAL LALA
## 3380                         MASTER FOODS USA
## 3381                              GRUPO BIMBO
## 3382                      PEPSI-COLA MEXICANA
## 3383                                   NESTLE
## 3384                            CADBURY ADAMS
## 3385                                COCA COLA
## 3386                                     ALEN
## 3387                                 SABRITAS
## 3388                                COCA COLA
## 3389                                    JUMEX
## 3390                     GILLETTE MANUFACTURA
## 3391                                COCA COLA
## 3392 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 3393                                COCA COLA
## 3394                                 SABRITAS
## 3395                                COCA COLA
## 3396                      PEPSI-COLA MEXICANA
## 3397                      PEPSI-COLA MEXICANA
## 3398         NACIONAL  DE ALIMENTOS Y HELADOS
## 3399                              GRUPO BIMBO
## 3400             JUGOS DEL VALLE S.A. DE C.V.
## 3401                        KELLOGG DE MEXICO
## 3402                                  MEXILAC
## 3403                      PEPSI-COLA MEXICANA
## 3404                          SIGMA ALIMENTOS
## 3405                      PEPSI-COLA MEXICANA
## 3406                      PEPSI-COLA MEXICANA
## 3407                                COCA COLA
## 3408                         DANONE DE MEXICO
## 3409                                COCA COLA
## 3410                                COCA COLA
## 3411                           GRUPO PEÑAFIEL
## 3412                                 SABRITAS
## 3413                      PEPSI-COLA MEXICANA
## 3414                      PEPSI-COLA MEXICANA
## 3415                                COCA COLA
## 3416                                  FERRERO
## 3417                      PEPSI-COLA MEXICANA
## 3418                                COCA COLA
## 3419                              GRUPO BIMBO
## 3420                          SIGMA ALIMENTOS
## 3421                                COCA COLA
## 3422                                COCA COLA
## 3423                                COCA COLA
## 3424               FABRICA DE JABON LA CORONA
## 3425             JUGOS DEL VALLE S.A. DE C.V.
## 3426                      PEPSI-COLA MEXICANA
## 3427                      PEPSI-COLA MEXICANA
## 3428                     CONAGRA FOODS MEXICO
## 3429                                 SABRITAS
## 3430                          SIGMA ALIMENTOS
## 3431                      PEPSI-COLA MEXICANA
## 3432                                     ALEN
## 3433                             GRUPO GAMESA
## 3434                           HERSHEY MEXICO
## 3435                              GRUPO BIMBO
## 3436                                COCA COLA
## 3437                                COCA COLA
## 3438                      PEPSI-COLA MEXICANA
## 3439                      PEPSI-COLA MEXICANA
## 3440                              GRUPO BIMBO
## 3441                      PEPSI-COLA MEXICANA
## 3442                                 MARUCHAN
## 3443               FABRICA DE JABON LA CORONA
## 3444                         DANONE DE MEXICO
## 3445                                COCA COLA
## 3446                       EMPACADORA JIMENEZ
## 3447                      PEPSI-COLA MEXICANA
## 3448                      PEPSI-COLA MEXICANA
## 3449                        PRODUCTOS LOL-TUN
## 3450                                   HERDEZ
## 3451                                COCA COLA
## 3452                      PEPSI-COLA MEXICANA
## 3453                                 SABORMEX
## 3454                          SIGMA ALIMENTOS
## 3455                                COCA COLA
## 3456                                COCA COLA
## 3457                              GRUPO BIMBO
## 3458                                 SABRITAS
## 3459                CONVERTIDORA DE PLASTICOS
## 3460                                 SABRITAS
## 3461                                 SABRITAS
## 3462                                 LIQUIMEX
## 3463                        ALIMENTOS CAPULLO
## 3464                                COCA COLA
## 3465                      PEPSI-COLA MEXICANA
## 3466                                COCA COLA
## 3467                 PROCTER & GAMBLE COMPANY
## 3468                                 QUALAMEX
## 3469                             GRUPO GAMESA
## 3470                 PROCTER & GAMBLE COMPANY
## 3471                      PEPSI-COLA MEXICANA
## 3472                                COCA COLA
## 3473                              GRUPO BIMBO
## 3474                                 SABRITAS
## 3475             JUGOS DEL VALLE S.A. DE C.V.
## 3476                                 SABRITAS
## 3477               ACEITES GRASAS Y DERIVADOS
## 3478                                  FERRERO
## 3479                                COCA COLA
## 3480          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 3481                              GRUPO BIMBO
## 3482                BOTANAS LEO, S.A. DE C.V.
## 3483                                COCA COLA
## 3484                      PEPSI-COLA MEXICANA
## 3485             JUGOS DEL VALLE S.A. DE C.V.
## 3486                       LABORATORIOS AVANT
## 3487               FABRICA DE JABON LA CORONA
## 3488                        COLGATE PALMOLIVE
## 3489                           MOLINOS AZTECA
## 3490                              GRUPO BIMBO
## 3491                                COCA COLA
## 3492                                   NESTLE
## 3493                                COCA COLA
## 3494                                COCA COLA
## 3495                             GRUPO GAMESA
## 3496                          SIGMA ALIMENTOS
## 3497                                COCA COLA
## 3498                                COCA COLA
## 3499             JUGOS DEL VALLE S.A. DE C.V.
## 3500                                COCA COLA
## 3501                              KRAFT FOODS
## 3502                     CONAGRA FOODS MEXICO
## 3503                                  MEXILAC
## 3504                      PEPSI-COLA MEXICANA
## 3505                     CONAGRA FOODS MEXICO
## 3506                      PEPSI-COLA MEXICANA
## 3507                                  MEXILAC
## 3508         NACIONAL  DE ALIMENTOS Y HELADOS
## 3509                                 SABRITAS
## 3510                             GRUPO GAMESA
## 3511                                     ALEN
## 3512                                COCA COLA
## 3513                                 SABRITAS
## 3514                                 SABRITAS
## 3515                                 SABRITAS
## 3516                                 SABRITAS
## 3517                                 SABRITAS
## 3518                                     ALEN
## 3519                    GRUPO INDUSTRIAL LALA
## 3520                                 SABRITAS
## 3521                                COCA COLA
## 3522                                     LINK
## 3523                              KRAFT FOODS
## 3524                                COCA COLA
## 3525                                 SABRITAS
## 3526             JUGOS DEL VALLE S.A. DE C.V.
## 3527                      PEPSI-COLA MEXICANA
## 3528                 PROCTER & GAMBLE COMPANY
## 3529                                COCA COLA
## 3530                      PEPSI-COLA MEXICANA
## 3531                             GRUPO GAMESA
## 3532                    GRUPO INDUSTRIAL LALA
## 3533                                COCA COLA
## 3534 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 3535                                 SABRITAS
## 3536                          VELADORA MEXICO
## 3537                          SALES DEL ISTMO
## 3538                        COLGATE PALMOLIVE
## 3539                             GRUPO GAMESA
## 3540                              GRUPO BIMBO
## 3541                             GRUPO GAMESA
## 3542                        KELLOGG DE MEXICO
## 3543                        PRODUCTOS LOL-TUN
## 3544                 PROCTER & GAMBLE COMPANY
## 3545                              GRUPO BIMBO
## 3546                     CONAGRA FOODS MEXICO
## 3547                               EMPACADOS 
## 3548                                COCA COLA
## 3549                                 SABRITAS
## 3550                                 SABRITAS
## 3551                                   NESTLE
## 3552                      PEPSI-COLA MEXICANA
## 3553                                COCA COLA
## 3554                      PEPSI-COLA MEXICANA
## 3555                         PRODUCTOS GERBER
## 3556                                COCA COLA
## 3557                             GRUPO GAMESA
## 3558                                COCA COLA
## 3559                              GRUPO BIMBO
## 3560                     CONAGRA FOODS MEXICO
## 3561                          SIGMA ALIMENTOS
## 3562                              GRUPO BIMBO
## 3563                                COCA COLA
## 3564                           SCA CONSUMIDOR
## 3565                    GRUPO INDUSTRIAL LALA
## 3566                              SPEED STICK
## 3567                    GRUPO INDUSTRIAL LALA
## 3568                              GRUPO BIMBO
## 3569                                  MEXILAC
## 3570                                COCA COLA
## 3571                         DANONE DE MEXICO
## 3572                      PEPSI-COLA MEXICANA
## 3573                                  MEXILAC
## 3574                      PEPSI-COLA MEXICANA
## 3575                                  CIGATAM
## 3576                              GRUPO BIMBO
## 3577                                COCA COLA
## 3578                                    JUMEX
## 3579                             GRUPO GAMESA
## 3580                        COLGATE PALMOLIVE
## 3581                 PROCTER & GAMBLE COMPANY
## 3582                              GRUPO BIMBO
## 3583                      PEPSI-COLA MEXICANA
## 3584                             GRUPO GAMESA
## 3585             JUGOS DEL VALLE S.A. DE C.V.
## 3586                      PEPSI-COLA MEXICANA
## 3587                BOTANAS LEO, S.A. DE C.V.
## 3588             JUGOS DEL VALLE S.A. DE C.V.
## 3589                    GRUPO INDUSTRIAL LALA
## 3590             JUGOS DEL VALLE S.A. DE C.V.
## 3591                              GRUPO BIMBO
## 3592                                 SABRITAS
## 3593                                COCA COLA
## 3594                                     LINK
## 3595                             GRUPO GAMESA
## 3596             JUGOS DEL VALLE S.A. DE C.V.
## 3597                                 MARUCHAN
## 3598             JUGOS DEL VALLE S.A. DE C.V.
## 3599                                 SABRITAS
## 3600                              GRUPO BIMBO
## 3601                                COCA COLA
## 3602                                COCA COLA
## 3603                                  KURUMBA
## 3604                                COCA COLA
## 3605                      PEPSI-COLA MEXICANA
## 3606                              GRUPO BIMBO
## 3607                                 SABRITAS
## 3608                                  CIGATAM
## 3609                                 SABRITAS
## 3610                    GRUPO INDUSTRIAL LALA
## 3611                CONVERTIDORA DE PLASTICOS
## 3612                                COCA COLA
## 3613                          CIA. TOPO CHICO
## 3614                                COCA COLA
## 3615                              GRUPO BIMBO
## 3616         NACIONAL  DE ALIMENTOS Y HELADOS
## 3617                                     ALEN
## 3618                                     ALEN
## 3619         NACIONAL  DE ALIMENTOS Y HELADOS
## 3620                              GRUPO BIMBO
## 3621                              GRUPO BIMBO
## 3622       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 3623                      PEPSI-COLA MEXICANA
## 3624                       UNILEVER DE MEXICO
## 3625                                 SABORMEX
## 3626                              KRAFT FOODS
## 3627                                 QUALAMEX
## 3628 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 3629                                 SABRITAS
## 3630                                 SABRITAS
## 3631                                COCA COLA
## 3632                          SIGMA ALIMENTOS
## 3633                    GRUPO INDUSTRIAL LALA
## 3634                      PEPSI-COLA MEXICANA
## 3635                CONVERTIDORA DE PLASTICOS
## 3636                          SIGMA ALIMENTOS
## 3637                                  FERRERO
## 3638                BOTANAS LEO, S.A. DE C.V.
## 3639                                 MARUCHAN
## 3640                              GRUPO BIMBO
## 3641                              GRUPO BIMBO
## 3642                                 SABRITAS
## 3643                      PEPSI-COLA MEXICANA
## 3644                                COCA COLA
## 3645 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 3646                                 MARUCHAN
## 3647                                COCA COLA
## 3648                    GRUPO INDUSTRIAL LALA
## 3649                                  FERRERO
## 3650                      PEPSI-COLA MEXICANA
## 3651                      PEPSI-COLA MEXICANA
## 3652                      PEPSI-COLA MEXICANA
## 3653                                COCA COLA
## 3654                                   NESTLE
## 3655                      PEPSI-COLA MEXICANA
## 3656                                COCA COLA
## 3657                                   NESTLE
## 3658                               EMPACADOS 
## 3659                          VELADORA MEXICO
## 3660                      PEPSI-COLA MEXICANA
## 3661                      PEPSI-COLA MEXICANA
## 3662                 PROCTER & GAMBLE COMPANY
## 3663                                COCA COLA
## 3664                                COCA COLA
## 3665                                  MEXILAC
## 3666               FABRICA DE JABON LA CORONA
## 3667                                 SABRITAS
## 3668                                 MARUCHAN
## 3669                                COCA COLA
## 3670                                 SABRITAS
## 3671                      PEPSI-COLA MEXICANA
## 3672                          SIGMA ALIMENTOS
## 3673                       GOMEZ CUETARA HNOS
## 3674                       GOMEZ CUETARA HNOS
## 3675                       EMPACADORA JIMENEZ
## 3676                 PROCTER & GAMBLE COMPANY
## 3677                                COCA COLA
## 3678                                COCA COLA
## 3679                        EMPACADORA NORVER
## 3680                        ALIMENTOS CAPULLO
## 3681                                COCA COLA
## 3682                                   NESTLE
## 3683                       UNILEVER DE MEXICO
## 3684               FABRICA DE JABON LA CORONA
## 3685                          SIGMA ALIMENTOS
## 3686                    GRUPO INDUSTRIAL LALA
## 3687                                   HERDEZ
## 3688               FABRICA DE JABON LA CORONA
## 3689                        COLGATE PALMOLIVE
## 3690                                  JUGOMEX
## 3691                                COCA COLA
## 3692                      PEPSI-COLA MEXICANA
## 3693                    GRUPO INDUSTRIAL LALA
## 3694                                COCA COLA
## 3695                                  FERRERO
## 3696                      PEPSI-COLA MEXICANA
## 3697                                    JUMEX
## 3698                      PEPSI-COLA MEXICANA
## 3699                      PEPSI-COLA MEXICANA
## 3700                                COCA COLA
## 3701                          CIA. TOPO CHICO
## 3702                      PEPSI-COLA MEXICANA
## 3703                                COCA COLA
## 3704       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 3705                      PEPSI-COLA MEXICANA
## 3706                           EFEM DE MEXICO
## 3707                                 SABRITAS
## 3708                      PEPSI-COLA MEXICANA
## 3709                                COCA COLA
## 3710                              KRAFT FOODS
## 3711                        COLGATE PALMOLIVE
## 3712                                COCA COLA
## 3713                                COCA COLA
## 3714                     ALIMENTOS DEL FUERTE
## 3715                                COCA COLA
## 3716                                DEL HOGAR
## 3717         NACIONAL  DE ALIMENTOS Y HELADOS
## 3718                                  FERRERO
## 3719                      PEPSI-COLA MEXICANA
## 3720                                COCA COLA
## 3721                                  CIGATAM
## 3722                              GRUPO BIMBO
## 3723         NACIONAL  DE ALIMENTOS Y HELADOS
## 3724                          CIA. TOPO CHICO
## 3725         NACIONAL  DE ALIMENTOS Y HELADOS
## 3726                              GRUPO BIMBO
## 3727                                COCA COLA
## 3728                              GRUPO BIMBO
## 3729                                COCA COLA
## 3730                          SIGMA ALIMENTOS
## 3731               ACEITES GRASAS Y DERIVADOS
## 3732                                 SABRITAS
## 3733                                 SABRITAS
## 3734                      PEPSI-COLA MEXICANA
## 3735                                COCA COLA
## 3736                                COCA COLA
## 3737                              GRUPO BIMBO
## 3738                                  CIGATAM
## 3739                      PEPSI-COLA MEXICANA
## 3740                      PEPSI-COLA MEXICANA
## 3741                                COCA COLA
## 3742                                COCA COLA
## 3743                                  CIGATAM
## 3744                                    JUMEX
## 3745                                 MARUCHAN
## 3746                      PEPSI-COLA MEXICANA
## 3747                              GRUPO BIMBO
## 3748                                 QUALAMEX
## 3749                                COCA COLA
## 3750                      PEPSI-COLA MEXICANA
## 3751                 PROCTER & GAMBLE COMPANY
## 3752                                 SABRITAS
## 3753             JUGOS DEL VALLE S.A. DE C.V.
## 3754                      PEPSI-COLA MEXICANA
## 3755                                 SABRITAS
## 3756                       UNILEVER DE MEXICO
## 3757                                 SABRITAS
## 3758                      PEPSI-COLA MEXICANA
## 3759                      PEPSI-COLA MEXICANA
## 3760                      PEPSI-COLA MEXICANA
## 3761                                 SABRITAS
## 3762                                 SABRITAS
## 3763                     CONSERVAS LA COSTEÑA
## 3764                      PEPSI-COLA MEXICANA
## 3765                CONVERTIDORA DE PLASTICOS
## 3766                                  FERRERO
## 3767                                COCA COLA
## 3768                                COCA COLA
## 3769                                COCA COLA
## 3770                      PEPSI-COLA MEXICANA
## 3771                                  SONRICS
## 3772                                 SABRITAS
## 3773                          SIGMA ALIMENTOS
## 3774                                PANASONIC
## 3775                                    JUMEX
## 3776                              GRUPO BIMBO
## 3777                      PEPSI-COLA MEXICANA
## 3778                                  KURUMBA
## 3779                      PEPSI-COLA MEXICANA
## 3780                      PEPSI-COLA MEXICANA
## 3781                                 SABRITAS
## 3782                      PEPSI-COLA MEXICANA
## 3783                                 SABRITAS
## 3784                          SIGMA ALIMENTOS
## 3785                          CIA. TOPO CHICO
## 3786                             GRUPO GAMESA
## 3787                            CADBURY ADAMS
## 3788                          SIGMA ALIMENTOS
## 3789               TOSTADAS Y BOTANAS PREMIUM
## 3790                                  KURUMBA
## 3791                          SIGMA ALIMENTOS
## 3792         NACIONAL  DE ALIMENTOS Y HELADOS
## 3793                                 SABRITAS
## 3794                BOTANAS LEO, S.A. DE C.V.
## 3795             JUGOS DEL VALLE S.A. DE C.V.
## 3796                          SIGMA ALIMENTOS
## 3797                          SIGMA ALIMENTOS
## 3798                          SIGMA ALIMENTOS
## 3799                                COCA COLA
## 3800                              KRAFT FOODS
## 3801                      PEPSI-COLA MEXICANA
## 3802                BOTANAS LEO, S.A. DE C.V.
## 3803         NACIONAL  DE ALIMENTOS Y HELADOS
## 3804                       EMPACADORA JIMENEZ
## 3805                                COCA COLA
## 3806                              GRUPO BIMBO
## 3807             JUGOS DEL VALLE S.A. DE C.V.
## 3808                                    JUMEX
## 3809                              KRAFT FOODS
## 3810                           EFEM DE MEXICO
## 3811                                 SABRITAS
## 3812                         DANONE DE MEXICO
## 3813                                COCA COLA
## 3814                                  CIGATAM
## 3815                              GRUPO BIMBO
## 3816                        KELLOGG DE MEXICO
## 3817                             GRUPO GAMESA
## 3818                                COCA COLA
## 3819                                COCA COLA
## 3820         NACIONAL  DE ALIMENTOS Y HELADOS
## 3821                                 SABRITAS
## 3822                           MEGA ALIMENTOS
## 3823                      PEPSI-COLA MEXICANA
## 3824                      PEPSI-COLA MEXICANA
## 3825                      PEPSI-COLA MEXICANA
## 3826                                COCA COLA
## 3827                      PEPSI-COLA MEXICANA
## 3828                 PROCTER & GAMBLE COMPANY
## 3829                                  FERRERO
## 3830                                PANASONIC
## 3831                                COCA COLA
## 3832                      PEPSI-COLA MEXICANA
## 3833                                  FERRERO
## 3834                      PEPSI-COLA MEXICANA
## 3835                                 QUALAMEX
## 3836                             GRUPO GAMESA
## 3837                             GRUPO GAMESA
## 3838                                COCA COLA
## 3839                      PEPSI-COLA MEXICANA
## 3840                                 SABRITAS
## 3841                              GRUPO BIMBO
## 3842                                 SABRITAS
## 3843             JUGOS DEL VALLE S.A. DE C.V.
## 3844                                COCA COLA
## 3845                                 SABRITAS
## 3846             JUGOS DEL VALLE S.A. DE C.V.
## 3847                             GRUPO GAMESA
## 3848                             GRUPO GAMESA
## 3849                              GRUPO BIMBO
## 3850                                    JUMEX
## 3851                          SIGMA ALIMENTOS
## 3852                      PEPSI-COLA MEXICANA
## 3853                              GRUPO BIMBO
## 3854                                     ALEN
## 3855                      PEPSI-COLA MEXICANA
## 3856                              CASA CUERVO
## 3857                                 SABRITAS
## 3858                                    JUMEX
## 3859                              KRAFT FOODS
## 3860                                 SABRITAS
## 3861                     GILLETTE MANUFACTURA
## 3862                            CADBURY ADAMS
## 3863                              GRUPO BIMBO
## 3864                          SIGMA ALIMENTOS
## 3865                                COCA COLA
## 3866                    GRUPO INDUSTRIAL LALA
## 3867                                   NESTLE
## 3868                                  CIGATAM
## 3869                     CONSERVAS LA COSTEÑA
## 3870                           GRUPO PEÑAFIEL
## 3871                CONVERTIDORA DE PLASTICOS
## 3872                CONVERTIDORA DE PLASTICOS
## 3873                      PEPSI-COLA MEXICANA
## 3874               FABRICA DE JABON LA CORONA
## 3875                      PEPSI-COLA MEXICANA
## 3876                         PRODUCTOS GERBER
## 3877                                  CIGATAM
## 3878                             GRUPO GAMESA
## 3879                              GRUPO BIMBO
## 3880                    GRUPO INDUSTRIAL LALA
## 3881               ACEITES GRASAS Y DERIVADOS
## 3882                                COCA COLA
## 3883                                PANASONIC
## 3884                                 SABRITAS
## 3885                                 SABRITAS
## 3886                                 SABRITAS
## 3887                                 SABRITAS
## 3888                     CAMPBELL'S DE MEXICO
## 3889                                     LINK
## 3890                          SIGMA ALIMENTOS
## 3891                    GRUPO INDUSTRIAL LALA
## 3892                                COCA COLA
## 3893                                COCA COLA
## 3894                                COCA COLA
## 3895                         DANONE DE MEXICO
## 3896                      PEPSI-COLA MEXICANA
## 3897               FABRICA DE JABON LA CORONA
## 3898                                COCA COLA
## 3899                                COCA COLA
## 3900                              GRUPO BIMBO
## 3901                      PEPSI-COLA MEXICANA
## 3902         NACIONAL  DE ALIMENTOS Y HELADOS
## 3903                                COCA COLA
## 3904                                COCA COLA
## 3905                    GRUPO INDUSTRIAL LALA
## 3906                            CADBURY ADAMS
## 3907                                COCA COLA
## 3908                                   ACT II
## 3909                             GRUPO GAMESA
## 3910                      PEPSI-COLA MEXICANA
## 3911                                COCA COLA
## 3912                                 LIQUIMEX
## 3913                              GRUPO BIMBO
## 3914                    GRUPO INDUSTRIAL LALA
## 3915                      PEPSI-COLA MEXICANA
## 3916                       MOLINERA DE MEXICO
## 3917                                  CIGATAM
## 3918                                     ALEN
## 3919                                 SABRITAS
## 3920                          SIGMA ALIMENTOS
## 3921  EMBOTELLADORA DE MARCAS INTERNACIONALES
## 3922                     CONAGRA FOODS MEXICO
## 3923                                COCA COLA
## 3924                                COCA COLA
## 3925             JUGOS DEL VALLE S.A. DE C.V.
## 3926                                 SABRITAS
## 3927         NACIONAL  DE ALIMENTOS Y HELADOS
## 3928         NACIONAL  DE ALIMENTOS Y HELADOS
## 3929                              GRUPO BIMBO
## 3930                      PEPSI-COLA MEXICANA
## 3931                      PEPSI-COLA MEXICANA
## 3932                                     LINK
## 3933                    GRUPO INDUSTRIAL LALA
## 3934                                COCA COLA
## 3935                          SIGMA ALIMENTOS
## 3936                              GRUPO BIMBO
## 3937                              GRUPO BIMBO
## 3938                          SIGMA ALIMENTOS
## 3939                                COCA COLA
## 3940                              GRUPO BIMBO
## 3941                                   NESTLE
## 3942                                  FERRERO
## 3943                                  CIGATAM
## 3944                                 SABRITAS
## 3945                                 SABRITAS
## 3946                                 SABRITAS
## 3947                                 SABRITAS
## 3948                                COCA COLA
## 3949                                   NESTLE
## 3950                                 SABRITAS
## 3951                                     LINK
## 3952                                 SABRITAS
## 3953                      PEPSI-COLA MEXICANA
## 3954                      PEPSI-COLA MEXICANA
## 3955                                  CIGATAM
## 3956                                 SABRITAS
## 3957                      PEPSI-COLA MEXICANA
## 3958                                 SABRITAS
## 3959                              GRUPO BIMBO
## 3960                                COCA COLA
## 3961                              GRUPO BIMBO
## 3962                      PEPSI-COLA MEXICANA
## 3963                                COCA COLA
## 3964                           BOTANAS BOGO´S
## 3965                      PEPSI-COLA MEXICANA
## 3966                                     LINK
## 3967                    GRUPO INDUSTRIAL LALA
## 3968                                  CIGATAM
## 3969                                 SABRITAS
## 3970                      PEPSI-COLA MEXICANA
## 3971                                COCA COLA
## 3972                      PEPSI-COLA MEXICANA
## 3973                      PEPSI-COLA MEXICANA
## 3974                      PEPSI-COLA MEXICANA
## 3975                          SALES DEL ISTMO
## 3976                      PEPSI-COLA MEXICANA
## 3977                                COCA COLA
## 3978                      INDUSTRIAS KOLALOKA
## 3979                        COLGATE PALMOLIVE
## 3980                              GRUPO BIMBO
## 3981                                COCA COLA
## 3982                      PEPSI-COLA MEXICANA
## 3983                              GRUPO BIMBO
## 3984                       EMPACADORA JIMENEZ
## 3985                    GRUPO INDUSTRIAL LALA
## 3986             JUGOS DEL VALLE S.A. DE C.V.
## 3987          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 3988                                COCA COLA
## 3989                                  KURUMBA
## 3990                      PEPSI-COLA MEXICANA
## 3991                              GRUPO BIMBO
## 3992                    GRUPO INDUSTRIAL LALA
## 3993                      PEPSI-COLA MEXICANA
## 3994                              GRUPO BIMBO
## 3995                                COCA COLA
## 3996          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 3997                      PEPSI-COLA MEXICANA
## 3998                              GRUPO BIMBO
## 3999                                COCA COLA
## 4000                                     ALEN
## 4001                 PROCTER & GAMBLE COMPANY
## 4002                          CIA. TOPO CHICO
## 4003                    GRUPO INDUSTRIAL LALA
## 4004                                 SABRITAS
## 4005               FABRICA DE JABON LA CORONA
## 4006                  Refrescos Pascual, S.A.
## 4007                                COCA COLA
## 4008                      PEPSI-COLA MEXICANA
## 4009                                  FERRERO
## 4010                                COCA COLA
## 4011                    GRUPO INDUSTRIAL LALA
## 4012                      PEPSI-COLA MEXICANA
## 4013                                  FERRERO
## 4014                              GRUPO BIMBO
## 4015                                COCA COLA
## 4016                              GRUPO BIMBO
## 4017                      PEPSI-COLA MEXICANA
## 4018                                COCA COLA
## 4019                                  FERRERO
## 4020                                 SABRITAS
## 4021               ACEITES GRASAS Y DERIVADOS
## 4022                                 SABRITAS
## 4023                              GRUPO BIMBO
## 4024                          SIGMA ALIMENTOS
## 4025                              GRUPO BIMBO
## 4026                      PEPSI-COLA MEXICANA
## 4027                 PROCTER & GAMBLE COMPANY
## 4028                                 SABRITAS
## 4029                              GRUPO BIMBO
## 4030                      PEPSI-COLA MEXICANA
## 4031       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 4032                                 SABRITAS
## 4033                             GRUPO GAMESA
## 4034                          SIGMA ALIMENTOS
## 4035                                COCA COLA
## 4036                                COCA COLA
## 4037                BOTANAS LEO, S.A. DE C.V.
## 4038         NACIONAL  DE ALIMENTOS Y HELADOS
## 4039                              GRUPO BIMBO
## 4040                              GRUPO BIMBO
## 4041                                 SABRITAS
## 4042                      PEPSI-COLA MEXICANA
## 4043                      PEPSI-COLA MEXICANA
## 4044                                COCA COLA
## 4045                      PEPSI-COLA MEXICANA
## 4046                      PEPSI-COLA MEXICANA
## 4047                                     LINK
## 4048                      PEPSI-COLA MEXICANA
## 4049                              GRUPO BIMBO
## 4050                          SIGMA ALIMENTOS
## 4051                                COCA COLA
## 4052             JUGOS DEL VALLE S.A. DE C.V.
## 4053             JUGOS DEL VALLE S.A. DE C.V.
## 4054                      PEPSI-COLA MEXICANA
## 4055                                COCA COLA
## 4056                              GRUPO BIMBO
## 4057                                COCA COLA
## 4058                                COCA COLA
## 4059                     CONSERVAS LA COSTEÑA
## 4060                              GRUPO BIMBO
## 4061                                COCA COLA
## 4062                          VELADORA MEXICO
## 4063                                     ALEN
## 4064                      PEPSI-COLA MEXICANA
## 4065                             GRUPO GAMESA
## 4066                      PEPSI-COLA MEXICANA
## 4067                    GRUPO INDUSTRIAL LALA
## 4068                                COCA COLA
## 4069                              GRUPO BIMBO
## 4070                              GRUPO BIMBO
## 4071                                   BARCEL
## 4072                      PEPSI-COLA MEXICANA
## 4073                              GRUPO BIMBO
## 4074                                 SABRITAS
## 4075                      PEPSI-COLA MEXICANA
## 4076                                 MARUCHAN
## 4077                              GRUPO BIMBO
## 4078                                COCA COLA
## 4079                              GRUPO BIMBO
## 4080                                COCA COLA
## 4081                                COCA COLA
## 4082                                   HERDEZ
## 4083                      PEPSI-COLA MEXICANA
## 4084         NACIONAL  DE ALIMENTOS Y HELADOS
## 4085                                 SABRITAS
## 4086                                 SABRITAS
## 4087                                 SABRITAS
## 4088                    GRUPO INDUSTRIAL LALA
## 4089                                COCA COLA
## 4090                              GRUPO BIMBO
## 4091                              GRUPO BIMBO
## 4092                              GRUPO BIMBO
## 4093                      PEPSI-COLA MEXICANA
## 4094                          CIA. TOPO CHICO
## 4095                                 SABRITAS
## 4096                                COCA COLA
## 4097       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 4098                                 SABRITAS
## 4099                                 SABRITAS
## 4100                                 SABRITAS
## 4101                    GRUPO INDUSTRIAL LALA
## 4102                                  FERRERO
## 4103                      PEPSI-COLA MEXICANA
## 4104                            MARINDUSTRIAS
## 4105                      PEPSI-COLA MEXICANA
## 4106                      PEPSI-COLA MEXICANA
## 4107                                     LINK
## 4108                              KRAFT FOODS
## 4109                    GRUPO INDUSTRIAL LALA
## 4110                                     ALEN
## 4111                                  CIGATAM
## 4112                                 SABRITAS
## 4113                                 SABRITAS
## 4114                              GRUPO BIMBO
## 4115                      PEPSI-COLA MEXICANA
## 4116                              KRAFT FOODS
## 4117                       EMPACADORA JIMENEZ
## 4118                                COCA COLA
## 4119                                   HERDEZ
## 4120                      PEPSI-COLA MEXICANA
## 4121                                 MARUCHAN
## 4122                                COCA COLA
## 4123                           EFEM DE MEXICO
## 4124                                COCA COLA
## 4125                                COCA COLA
## 4126                           PROCOPSA DE CV
## 4127                                COCA COLA
## 4128                      PEPSI-COLA MEXICANA
## 4129                                 SABRITAS
## 4130                      PEPSI-COLA MEXICANA
## 4131                                     ALEN
## 4132                                     ALEN
## 4133                              GRUPO BIMBO
## 4134                    GRUPO INDUSTRIAL LALA
## 4135                                COCA COLA
## 4136                      PEPSI-COLA MEXICANA
## 4137                      PEPSI-COLA MEXICANA
## 4138                             GRUPO GAMESA
## 4139                                     LINK
## 4140                              GRUPO BIMBO
## 4141                                COCA COLA
## 4142                               LA CENTRAL
## 4143                      PEPSI-COLA MEXICANA
## 4144               FABRICA DE JABON LA CORONA
## 4145                                COCA COLA
## 4146                                 SABRITAS
## 4147                                  MEXILAC
## 4148                                 LIQUIMEX
## 4149                                COCA COLA
## 4150                                 SABRITAS
## 4151                BOTANAS LEO, S.A. DE C.V.
## 4152                      PEPSI-COLA MEXICANA
## 4153                              GRUPO BIMBO
## 4154                      PEPSI-COLA MEXICANA
## 4155                                     ALEN
## 4156               FABRICA DE JABON LA CORONA
## 4157                     CONSERVAS LA COSTEÑA
## 4158                         DANONE DE MEXICO
## 4159                          SIGMA ALIMENTOS
## 4160               FABRICA DE JABON LA CORONA
## 4161                                     ALEN
## 4162                                     ALEN
## 4163               FABRICA DE JABON LA CORONA
## 4164                           KIMBERLY CLARK
## 4165                        COLGATE PALMOLIVE
## 4166                          VELADORA MEXICO
## 4167                              GRUPO BIMBO
## 4168                      PEPSI-COLA MEXICANA
## 4169                              GRUPO BIMBO
## 4170                    GRUPO INDUSTRIAL LALA
## 4171                                COCA COLA
## 4172                       GOMEZ CUETARA HNOS
## 4173                                 SABRITAS
## 4174                           GRUPO PEÑAFIEL
## 4175                                COCA COLA
## 4176                                COCA COLA
## 4177                    GRUPO INDUSTRIAL LALA
## 4178                    GRUPO INDUSTRIAL LALA
## 4179                                   NESTLE
## 4180                      PEPSI-COLA MEXICANA
## 4181                                COCA COLA
## 4182                                COCA COLA
## 4183                                  MEXILAC
## 4184                         DANONE DE MEXICO
## 4185                                  MEXILAC
## 4186                                COCA COLA
## 4187                            CADBURY ADAMS
## 4188                          CIA. TOPO CHICO
## 4189                                    JUMEX
## 4190                      PEPSI-COLA MEXICANA
## 4191             JUGOS DEL VALLE S.A. DE C.V.
## 4192                      PEPSI-COLA MEXICANA
## 4193           FABRICA DE PAPEL SAN FRANCISCO
## 4194                      PEPSI-COLA MEXICANA
## 4195            SANTA CLARA PRODUCTOS LACTEOS
## 4196                                COCA COLA
## 4197             JUGOS DEL VALLE S.A. DE C.V.
## 4198                                COCA COLA
## 4199                                COCA COLA
## 4200                                COCA COLA
## 4201                            MARINDUSTRIAS
## 4202                                COCA COLA
## 4203                      PEPSI-COLA MEXICANA
## 4204                                 SABRITAS
## 4205                      PEPSI-COLA MEXICANA
## 4206                                  FERRERO
## 4207               FABRICA DE JABON LA CORONA
## 4208               FABRICA DE JABON LA CORONA
## 4209                                 SABRITAS
## 4210                                  MEXILAC
## 4211                             GRUPO GAMESA
## 4212                      PEPSI-COLA MEXICANA
## 4213                                COCA COLA
## 4214                          BUENO ALIMENTOS
## 4215               FABRICA DE JABON LA CORONA
## 4216          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4217                        EMPACADORA NORVER
## 4218                              GRUPO BIMBO
## 4219                          CIA. TOPO CHICO
## 4220                      PEPSI-COLA MEXICANA
## 4221             JUGOS DEL VALLE S.A. DE C.V.
## 4222                                    JUMEX
## 4223                                COCA COLA
## 4224       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 4225                      PEPSI-COLA MEXICANA
## 4226                                COCA COLA
## 4227          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4228                                 SABRITAS
## 4229                      PEPSI-COLA MEXICANA
## 4230                                   NEVADA
## 4231                                  FERRERO
## 4232                      PEPSI-COLA MEXICANA
## 4233                       UNILEVER DE MEXICO
## 4234          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4235                                COCA COLA
## 4236                BOTANAS LEO, S.A. DE C.V.
## 4237                      PEPSI-COLA MEXICANA
## 4238                                COCA COLA
## 4239                      PEPSI-COLA MEXICANA
## 4240                                COCA COLA
## 4241                                COCA COLA
## 4242                      PEPSI-COLA MEXICANA
## 4243                                COCA COLA
## 4244                                COCA COLA
## 4245                    GRUPO INDUSTRIAL LALA
## 4246                BOTANAS LEO, S.A. DE C.V.
## 4247                BOTANAS LEO, S.A. DE C.V.
## 4248                BOTANAS LEO, S.A. DE C.V.
## 4249                      PEPSI-COLA MEXICANA
## 4250                             GRUPO GAMESA
## 4251                                COCA COLA
## 4252                      PEPSI-COLA MEXICANA
## 4253                                COCA COLA
## 4254             JUGOS DEL VALLE S.A. DE C.V.
## 4255                                 SABRITAS
## 4256                                 SABRITAS
## 4257                     CONSERVAS LA COSTEÑA
## 4258             JUGOS DEL VALLE S.A. DE C.V.
## 4259                                 SABRITAS
## 4260                                 SABRITAS
## 4261             JUGOS DEL VALLE S.A. DE C.V.
## 4262                                COCA COLA
## 4263                      PEPSI-COLA MEXICANA
## 4264                      PEPSI-COLA MEXICANA
## 4265                                COCA COLA
## 4266                       GOMEZ CUETARA HNOS
## 4267                                   NESTLE
## 4268                                 SABRITAS
## 4269                                COCA COLA
## 4270           FABRICA DE PAPEL SAN FRANCISCO
## 4271                CONVERTIDORA DE PLASTICOS
## 4272                      PEPSI-COLA MEXICANA
## 4273                                COCA COLA
## 4274                CONVERTIDORA DE PLASTICOS
## 4275         NACIONAL  DE ALIMENTOS Y HELADOS
## 4276                                COCA COLA
## 4277                             GRUPO GAMESA
## 4278                                     LINK
## 4279                              GRUPO BIMBO
## 4280                              GRUPO BIMBO
## 4281                                     ALEN
## 4282                          SIGMA ALIMENTOS
## 4283                                   HENKEL
## 4284                              GRUPO BIMBO
## 4285 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 4286                                 SABRITAS
## 4287                                COCA COLA
## 4288                                 SABRITAS
## 4289                      ABSORMEX S.A DE C.V
## 4290                                 BELTICOS
## 4291                          CIA. TOPO CHICO
## 4292                      PEPSI-COLA MEXICANA
## 4293                                COCA COLA
## 4294                CONVERTIDORA DE PLASTICOS
## 4295               FABRICA DE JABON LA CORONA
## 4296                      PEPSI-COLA MEXICANA
## 4297                                  MEXILAC
## 4298                      PEPSI-COLA MEXICANA
## 4299                      PEPSI-COLA MEXICANA
## 4300                      PEPSI-COLA MEXICANA
## 4301 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 4302         NACIONAL  DE ALIMENTOS Y HELADOS
## 4303                      PEPSI-COLA MEXICANA
## 4304                                   NESTLE
## 4305                      PEPSI-COLA MEXICANA
## 4306                                   NESTLE
## 4307                       GOMEZ CUETARA HNOS
## 4308             JUGOS DEL VALLE S.A. DE C.V.
## 4309             JUGOS DEL VALLE S.A. DE C.V.
## 4310                      PEPSI-COLA MEXICANA
## 4311                                     LINK
## 4312                                 SABRITAS
## 4313                           GRUPO PEÑAFIEL
## 4314                     CONAGRA FOODS MEXICO
## 4315                                COCA COLA
## 4316                                 SABRITAS
## 4317                                COCA COLA
## 4318                                 SABRITAS
## 4319                     BRISTOL-MYERS SQUIBB
## 4320                                 MARUCHAN
## 4321                                 MARUCHAN
## 4322                                COCA COLA
## 4323          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4324                                  KURUMBA
## 4325                      PEPSI-COLA MEXICANA
## 4326                              GRUPO BIMBO
## 4327         NACIONAL  DE ALIMENTOS Y HELADOS
## 4328                      PEPSI-COLA MEXICANA
## 4329                                COCA COLA
## 4330         NACIONAL  DE ALIMENTOS Y HELADOS
## 4331                BOTANAS LEO, S.A. DE C.V.
## 4332                                 SABRITAS
## 4333                                 SABRITAS
## 4334                      PEPSI-COLA MEXICANA
## 4335         NACIONAL  DE ALIMENTOS Y HELADOS
## 4336                                 SABRITAS
## 4337                      PEPSI-COLA MEXICANA
## 4338                      PEPSI-COLA MEXICANA
## 4339                                 SABRITAS
## 4340                              KRAFT FOODS
## 4341                                  CIGATAM
## 4342                                     LINK
## 4343              TOSTADAS HIDALGO S.A DE C.V
## 4344               FABRICA DE JABON LA CORONA
## 4345                                     ALEN
## 4346                      PEPSI-COLA MEXICANA
## 4347                         DANONE DE MEXICO
## 4348                                  MEXILAC
## 4349                      PEPSI-COLA MEXICANA
## 4350                              KRAFT FOODS
## 4351                          SIGMA ALIMENTOS
## 4352                                COCA COLA
## 4353                                COCA COLA
## 4354                                 MARUCHAN
## 4355                      PEPSI-COLA MEXICANA
## 4356                         DANONE DE MEXICO
## 4357                             GRUPO GAMESA
## 4358                         DANONE DE MEXICO
## 4359                         DANONE DE MEXICO
## 4360                                COCA COLA
## 4361                BOTANAS LEO, S.A. DE C.V.
## 4362                      PEPSI-COLA MEXICANA
## 4363                                COCA COLA
## 4364                      PEPSI-COLA MEXICANA
## 4365                      PEPSI-COLA MEXICANA
## 4366                                COCA COLA
## 4367                     CONSERVAS LA COSTEÑA
## 4368                              KRAFT FOODS
## 4369                              GRUPO BIMBO
## 4370                      PEPSI-COLA MEXICANA
## 4371                                 SABRITAS
## 4372                                 SABRITAS
## 4373         NACIONAL  DE ALIMENTOS Y HELADOS
## 4374                       UNILEVER DE MEXICO
## 4375                      PEPSI-COLA MEXICANA
## 4376                           KIMBERLY CLARK
## 4377                                  FERRERO
## 4378                           BOTANAS BOGO´S
## 4379                                  FERRERO
## 4380                           GRUPO PEÑAFIEL
## 4381                                COCA COLA
## 4382         NACIONAL  DE ALIMENTOS Y HELADOS
## 4383                    GRUPO INDUSTRIAL LALA
## 4384                      PEPSI-COLA MEXICANA
## 4385          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4386             JUGOS DEL VALLE S.A. DE C.V.
## 4387                                COCA COLA
## 4388               TOSTADAS Y BOTANAS PREMIUM
## 4389                      PEPSI-COLA MEXICANA
## 4390                             GRUPO GAMESA
## 4391             JUGOS DEL VALLE S.A. DE C.V.
## 4392 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 4393                      PEPSI-COLA MEXICANA
## 4394         NACIONAL  DE ALIMENTOS Y HELADOS
## 4395                                COCA COLA
## 4396                      PEPSI-COLA MEXICANA
## 4397                      PEPSI-COLA MEXICANA
## 4398                      PEPSI-COLA MEXICANA
## 4399                              GRUPO BIMBO
## 4400                BOTANAS LEO, S.A. DE C.V.
## 4401                      PEPSI-COLA MEXICANA
## 4402                                   ACT II
## 4403                                 SABRITAS
## 4404                              GRUPO BIMBO
## 4405                                COCA COLA
## 4406                                 SABRITAS
## 4407                                  MEXILAC
## 4408                                COCA COLA
## 4409                                 SABRITAS
## 4410                    S. C. JOHNSON AND SON
## 4411                                 SABRITAS
## 4412                      PEPSI-COLA MEXICANA
## 4413                                COCA COLA
## 4414                          SIGMA ALIMENTOS
## 4415                                 SABRITAS
## 4416                                 SABRITAS
## 4417                    GRUPO INDUSTRIAL LALA
## 4418                                 SABRITAS
## 4419                                 SABRITAS
## 4420                BOTANAS LEO, S.A. DE C.V.
## 4421                                 SABRITAS
## 4422                    GRUPO INDUSTRIAL LALA
## 4423                          SIGMA ALIMENTOS
## 4424                                COCA COLA
## 4425                 PROCTER & GAMBLE COMPANY
## 4426               FABRICA DE JABON LA CORONA
## 4427                             GRUPO GAMESA
## 4428                                    JUMEX
## 4429                                   NESTLE
## 4430                      PEPSI-COLA MEXICANA
## 4431                                COCA COLA
## 4432           FABRICA DE PAPEL SAN FRANCISCO
## 4433                                 SABRITAS
## 4434                                 SABRITAS
## 4435                                 SABRITAS
## 4436                           MEGA ALIMENTOS
## 4437                                 SABORMEX
## 4438         NACIONAL  DE ALIMENTOS Y HELADOS
## 4439                                  JUGOMEX
## 4440                                 SABRITAS
## 4441                                 SABRITAS
## 4442                                 SABRITAS
## 4443                                COCA COLA
## 4444                      PEPSI-COLA MEXICANA
## 4445                                 QUALAMEX
## 4446                                 SABRITAS
## 4447                      PEPSI-COLA MEXICANA
## 4448                                COCA COLA
## 4449                           EFEM DE MEXICO
## 4450                      PEPSI-COLA MEXICANA
## 4451                                 SABRITAS
## 4452                      PEPSI-COLA MEXICANA
## 4453                  Refrescos Pascual, S.A.
## 4454                                 SABRITAS
## 4455                                COCA COLA
## 4456                                COCA COLA
## 4457                      PEPSI-COLA MEXICANA
## 4458                           EFEM DE MEXICO
## 4459                          SIGMA ALIMENTOS
## 4460                       GOMEZ CUETARA HNOS
## 4461                      PEPSI-COLA MEXICANA
## 4462                                 SABRITAS
## 4463                       UNILEVER DE MEXICO
## 4464                              GRUPO BIMBO
## 4465                                  FERRERO
## 4466                            CADBURY ADAMS
## 4467                          SALES DEL ISTMO
## 4468               FABRICA DE JABON LA CORONA
## 4469                      PEPSI-COLA MEXICANA
## 4470                                COCA COLA
## 4471                                COCA COLA
## 4472                                COCA COLA
## 4473                                 SABRITAS
## 4474                     CONAGRA FOODS MEXICO
## 4475                                     LINK
## 4476                      PEPSI-COLA MEXICANA
## 4477                                COCA COLA
## 4478          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4479                              KRAFT FOODS
## 4480                                 SABRITAS
## 4481                              GRUPO BIMBO
## 4482                      PEPSI-COLA MEXICANA
## 4483                                COCA COLA
## 4484                           MEGA ALIMENTOS
## 4485                                COCA COLA
## 4486                   COMERCIALIZADORA GOMEZ
## 4487                                COCA COLA
## 4488                              KRAFT FOODS
## 4489                                   NESTLE
## 4490                      PEPSI-COLA MEXICANA
## 4491                          SIGMA ALIMENTOS
## 4492                      PEPSI-COLA MEXICANA
## 4493          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4494               TOSTADAS Y BOTANAS PREMIUM
## 4495             JUGOS DEL VALLE S.A. DE C.V.
## 4496          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4497                          SALES DEL ISTMO
## 4498                                   NESTLE
## 4499                      PEPSI-COLA MEXICANA
## 4500                     CONSERVAS LA COSTEÑA
## 4501                                 SABRITAS
## 4502                                 SABRITAS
## 4503                                 SABRITAS
## 4504                                COCA COLA
## 4505                              GRUPO BIMBO
## 4506                                COCA COLA
## 4507                              GRUPO BIMBO
## 4508                                COCA COLA
## 4509                                  MEXILAC
## 4510                         DANONE DE MEXICO
## 4511                                 QUALAMEX
## 4512                PESCADOS INDUSTRIALIZADOS
## 4513                                COCA COLA
## 4514                    GRUPO INDUSTRIAL LALA
## 4515                      PEPSI-COLA MEXICANA
## 4516                      PEPSI-COLA MEXICANA
## 4517               FABRICA DE JABON LA CORONA
## 4518                                 SABRITAS
## 4519          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4520 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 4521                                 SABRITAS
## 4522                                 SABRITAS
## 4523                      PEPSI-COLA MEXICANA
## 4524                                COCA COLA
## 4525                     CONSERVAS LA COSTEÑA
## 4526                                COCA COLA
## 4527                                   NESTLE
## 4528   IMPORTACIONES HNOS. CANTú S.A. DE C.V.
## 4529                             GRUPO GAMESA
## 4530         NACIONAL  DE ALIMENTOS Y HELADOS
## 4531                        RAGASA INDUSTRIAS
## 4532                          SALES DEL ISTMO
## 4533                      PEPSI-COLA MEXICANA
## 4534                              KRAFT FOODS
## 4535                               EMPACADOS 
## 4536                                 SABRITAS
## 4537                                    JUMEX
## 4538                          CIA. TOPO CHICO
## 4539                                COCA COLA
## 4540                     BRISTOL-MYERS SQUIBB
## 4541                                 SABRITAS
## 4542                                     ALEN
## 4543                 PROCTER & GAMBLE COMPANY
## 4544                              GRUPO BIMBO
## 4545                     CONSERVAS LA COSTEÑA
## 4546                       UNILEVER DE MEXICO
## 4547                          SIGMA ALIMENTOS
## 4548                                 MARUCHAN
## 4549             JUGOS DEL VALLE S.A. DE C.V.
## 4550                                COCA COLA
## 4551                                 SABRITAS
## 4552                                 SABORMEX
## 4553                                COCA COLA
## 4554                                 QUALAMEX
## 4555                BOTANAS LEO, S.A. DE C.V.
## 4556         NACIONAL  DE ALIMENTOS Y HELADOS
## 4557         NACIONAL  DE ALIMENTOS Y HELADOS
## 4558                                 SABRITAS
## 4559             JUGOS DEL VALLE S.A. DE C.V.
## 4560                             GRUPO GAMESA
## 4561                                 SABRITAS
## 4562                      PEPSI-COLA MEXICANA
## 4563                      PEPSI-COLA MEXICANA
## 4564                          SIGMA ALIMENTOS
## 4565                        COLGATE PALMOLIVE
## 4566                                     ALEN
## 4567                                 SABRITAS
## 4568                                COCA COLA
## 4569                      PEPSI-COLA MEXICANA
## 4570                         MASTER FOODS USA
## 4571                          SIGMA ALIMENTOS
## 4572             JUGOS DEL VALLE S.A. DE C.V.
## 4573                      PEPSI-COLA MEXICANA
## 4574               FABRICA DE JABON LA CORONA
## 4575                        ALIMENTOS CAPULLO
## 4576                                COCA COLA
## 4577                              GRUPO BIMBO
## 4578                    GRUPO INDUSTRIAL LALA
## 4579                      PEPSI-COLA MEXICANA
## 4580          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4581                              KRAFT FOODS
## 4582                      PEPSI-COLA MEXICANA
## 4583                             GRUPO GAMESA
## 4584                      PEPSI-COLA MEXICANA
## 4585                      PEPSI-COLA MEXICANA
## 4586                      PEPSI-COLA MEXICANA
## 4587                          SIGMA ALIMENTOS
## 4588                              GRUPO BIMBO
## 4589                     CONSERVAS LA COSTEÑA
## 4590                      PEPSI-COLA MEXICANA
## 4591                     CONAGRA FOODS MEXICO
## 4592                    GRUPO INDUSTRIAL LALA
## 4593                          MONROE CHEMICAL
## 4594                             GRUPO GAMESA
## 4595                            CADBURY ADAMS
## 4596                             GRUPO GAMESA
## 4597                              GRUPO BIMBO
## 4598                         DANONE DE MEXICO
## 4599                      PEPSI-COLA MEXICANA
## 4600                                COCA COLA
## 4601                                 SABRITAS
## 4602                      PEPSI-COLA MEXICANA
## 4603                          SIGMA ALIMENTOS
## 4604                                    JUMEX
## 4605                                  CIGATAM
## 4606                                 RICOLINO
## 4607                                COCA COLA
## 4608                                    JUMEX
## 4609                              GRUPO BIMBO
## 4610                          VELADORA MEXICO
## 4611                                     ALEN
## 4612         NACIONAL  DE ALIMENTOS Y HELADOS
## 4613                      PEPSI-COLA MEXICANA
## 4614                                COCA COLA
## 4615               FABRICA DE JABON LA CORONA
## 4616                BOTANAS LEO, S.A. DE C.V.
## 4617                         DANONE DE MEXICO
## 4618                BOTANAS LEO, S.A. DE C.V.
## 4619                                COCA COLA
## 4620                            CADBURY ADAMS
## 4621                     CONSERVAS LA COSTEÑA
## 4622                              GRUPO BIMBO
## 4623                                COCA COLA
## 4624                      PEPSI-COLA MEXICANA
## 4625                                  FERRERO
## 4626                  Refrescos Pascual, S.A.
## 4627                      PEPSI-COLA MEXICANA
## 4628                      PEPSI-COLA MEXICANA
## 4629                                  CIGATAM
## 4630                      PEPSI-COLA MEXICANA
## 4631                      PEPSI-COLA MEXICANA
## 4632                        COLGATE PALMOLIVE
## 4633                                   ACT II
## 4634                          SIGMA ALIMENTOS
## 4635                      PEPSI-COLA MEXICANA
## 4636                          CIA. TOPO CHICO
## 4637                                COCA COLA
## 4638                                COCA COLA
## 4639                                COCA COLA
## 4640                         DANONE DE MEXICO
## 4641                              GRUPO BIMBO
## 4642                      INDUSTRIAS KOLALOKA
## 4643                          SIGMA ALIMENTOS
## 4644                                  KURUMBA
## 4645                            MARINDUSTRIAS
## 4646                      PEPSI-COLA MEXICANA
## 4647           FABRICA DE PAPEL SAN FRANCISCO
## 4648                              KRAFT FOODS
## 4649          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4650                      PEPSI-COLA MEXICANA
## 4651                          SIGMA ALIMENTOS
## 4652                                  CIGATAM
## 4653                BOTANAS LEO, S.A. DE C.V.
## 4654                                 SABRITAS
## 4655                          CIA. TOPO CHICO
## 4656                      PEPSI-COLA MEXICANA
## 4657                              GRUPO BIMBO
## 4658                 PROCTER & GAMBLE COMPANY
## 4659                                COCA COLA
## 4660                                     LINK
## 4661                      PEPSI-COLA MEXICANA
## 4662                        COLGATE PALMOLIVE
## 4663                              GRUPO BIMBO
## 4664                                 SABRITAS
## 4665                                 SABRITAS
## 4666                      PEPSI-COLA MEXICANA
## 4667                      PEPSI-COLA MEXICANA
## 4668                      PEPSI-COLA MEXICANA
## 4669                      PEPSI-COLA MEXICANA
## 4670                           SALSA TAMAZULA
## 4671                      PEPSI-COLA MEXICANA
## 4672                                   NESTLE
## 4673                      PEPSI-COLA MEXICANA
## 4674                                 SABRITAS
## 4675                 PROCTER & GAMBLE COMPANY
## 4676                                COCA COLA
## 4677                                COCA COLA
## 4678                        KELLOGG DE MEXICO
## 4679                                COCA COLA
## 4680                    GRUPO INDUSTRIAL LALA
## 4681                                  CIGATAM
## 4682                      PEPSI-COLA MEXICANA
## 4683                                  KURUMBA
## 4684                  Refrescos Pascual, S.A.
## 4685             JUGOS DEL VALLE S.A. DE C.V.
## 4686               TOSTADAS Y BOTANAS PREMIUM
## 4687       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 4688                      PEPSI-COLA MEXICANA
## 4689                                  FERRERO
## 4690                                 SABRITAS
## 4691                          SIGMA ALIMENTOS
## 4692             JUGOS DEL VALLE S.A. DE C.V.
## 4693                                 SABRITAS
## 4694                                COCA COLA
## 4695          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4696                    GRUPO INDUSTRIAL LALA
## 4697                              GRUPO BIMBO
## 4698                                COCA COLA
## 4699                                COCA COLA
## 4700                       UNILEVER DE MEXICO
## 4701                              KRAFT FOODS
## 4702                              KRAFT FOODS
## 4703                          SIGMA ALIMENTOS
## 4704                                     MARS
## 4705                                 SABRITAS
## 4706                      PEPSI-COLA MEXICANA
## 4707                      PEPSI-COLA MEXICANA
## 4708                                COCA COLA
## 4709                    GRUPO INDUSTRIAL LALA
## 4710                       UNILEVER DE MEXICO
## 4711                      PEPSI-COLA MEXICANA
## 4712          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4713                                 SABRITAS
## 4714                                 SABRITAS
## 4715               TOSTADAS Y BOTANAS PREMIUM
## 4716                                 MARUCHAN
## 4717                     CONSERVAS LA COSTEÑA
## 4718                          SIGMA ALIMENTOS
## 4719                      PEPSI-COLA MEXICANA
## 4720                                 MARUCHAN
## 4721                       LAMBI S.A. DE C.V.
## 4722                                   HERDEZ
## 4723                              KRAFT FOODS
## 4724                       EMPACADORA JIMENEZ
## 4725                          SIGMA ALIMENTOS
## 4726                              GRUPO BIMBO
## 4727                             GRUPO GAMESA
## 4728                         DANONE DE MEXICO
## 4729                          VELADORA MEXICO
## 4730                         DANONE DE MEXICO
## 4731                              GRUPO BIMBO
## 4732                                  MEXILAC
## 4733                   COMERCIALIZADORA GOMEZ
## 4734                        EMPACADORA NORVER
## 4735               FABRICA DE JABON LA CORONA
## 4736                              GRUPO BIMBO
## 4737                        COLGATE PALMOLIVE
## 4738                             GRUPO GAMESA
## 4739                      PEPSI-COLA MEXICANA
## 4740                                COCA COLA
## 4741                                COCA COLA
## 4742                                     ALEN
## 4743                                COCA COLA
## 4744                      PEPSI-COLA MEXICANA
## 4745                           MOLINOS AZTECA
## 4746                              KRAFT FOODS
## 4747                              KRAFT FOODS
## 4748                                   COSBEL
## 4749                                COCA COLA
## 4750             JUGOS DEL VALLE S.A. DE C.V.
## 4751                      PEPSI-COLA MEXICANA
## 4752                                COCA COLA
## 4753                             GRUPO GAMESA
## 4754                      PEPSI-COLA MEXICANA
## 4755                              GRUPO BIMBO
## 4756               PASTAS MOLISABA S.A DE C.V
## 4757                              GRUPO BIMBO
## 4758             JUGOS DEL VALLE S.A. DE C.V.
## 4759                                COCA COLA
## 4760                                   NESTLE
## 4761                              GRUPO BIMBO
## 4762                             GRUPO GAMESA
## 4763                      PEPSI-COLA MEXICANA
## 4764                                 LIQUIMEX
## 4765                              GRUPO BIMBO
## 4766                      PEPSI-COLA MEXICANA
## 4767                              KRAFT FOODS
## 4768             JUGOS DEL VALLE S.A. DE C.V.
## 4769                                     LINK
## 4770                                     LINK
## 4771                              GRUPO BIMBO
## 4772                       UNILEVER DE MEXICO
## 4773                             GRUPO GAMESA
## 4774                                   NESTLE
## 4775                    GRUPO INDUSTRIAL LALA
## 4776                                COCA COLA
## 4777                             AJEMONTERREY
## 4778                              KRAFT FOODS
## 4779                              KRAFT FOODS
## 4780                          SALES DEL ISTMO
## 4781                                     LINK
## 4782                      PEPSI-COLA MEXICANA
## 4783                                COCA COLA
## 4784                                COCA COLA
## 4785                     CONAGRA FOODS MEXICO
## 4786                      PEPSI-COLA MEXICANA
## 4787         NACIONAL  DE ALIMENTOS Y HELADOS
## 4788                                COCA COLA
## 4789                                COCA COLA
## 4790                           MEGA ALIMENTOS
## 4791                                   NESTLE
## 4792               FABRICA DE JABON LA CORONA
## 4793                      PEPSI-COLA MEXICANA
## 4794                      PEPSI-COLA MEXICANA
## 4795                                   NESTLE
## 4796                 PROCTER & GAMBLE COMPANY
## 4797                                  FERRERO
## 4798                                     ALEN
## 4799          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4800                                 SABRITAS
## 4801                      PEPSI-COLA MEXICANA
## 4802                    GRUPO INDUSTRIAL LALA
## 4803                                 MARUCHAN
## 4804                      PEPSI-COLA MEXICANA
## 4805                          CIA. TOPO CHICO
## 4806                      PEPSI-COLA MEXICANA
## 4807                                COCA COLA
## 4808                                COCA COLA
## 4809                        ALIMENTOS CAPULLO
## 4810                                 LIQUIMEX
## 4811                      PEPSI-COLA MEXICANA
## 4812                                     ALEN
## 4813                                     LINK
## 4814                           MEGA ALIMENTOS
## 4815                              GRUPO BIMBO
## 4816                      PEPSI-COLA MEXICANA
## 4817                               EMPACADOS 
## 4818                       UNILEVER DE MEXICO
## 4819                                COCA COLA
## 4820                             GRUPO GAMESA
## 4821                              GRUPO BIMBO
## 4822                                 LIQUIMEX
## 4823                                COCA COLA
## 4824                                COCA COLA
## 4825                                  CIGATAM
## 4826                                     LINK
## 4827                                COCA COLA
## 4828                                     ALEN
## 4829             JUGOS DEL VALLE S.A. DE C.V.
## 4830                          CIA. TOPO CHICO
## 4831                     CAMPBELL'S DE MEXICO
## 4832                                  KURUMBA
## 4833                                COCA COLA
## 4834                          SIGMA ALIMENTOS
## 4835                                   NESTLE
## 4836                      PEPSI-COLA MEXICANA
## 4837                      PEPSI-COLA MEXICANA
## 4838                                  CIGATAM
## 4839                                COCA COLA
## 4840                  Refrescos Pascual, S.A.
## 4841                             GRUPO GAMESA
## 4842                              GRUPO BIMBO
## 4843               FABRICA DE JABON LA CORONA
## 4844                       UNILEVER DE MEXICO
## 4845                                   NESTLE
## 4846                                COCA COLA
## 4847                      PEPSI-COLA MEXICANA
## 4848                                COCA COLA
## 4849                              GRUPO BIMBO
## 4850                          SIGMA ALIMENTOS
## 4851                          SIGMA ALIMENTOS
## 4852                                COCA COLA
## 4853                      PEPSI-COLA MEXICANA
## 4854                                 SABRITAS
## 4855                             GRUPO GAMESA
## 4856                                COCA COLA
## 4857                              GRUPO BIMBO
## 4858                              GRUPO BIMBO
## 4859                      PEPSI-COLA MEXICANA
## 4860                      PEPSI-COLA MEXICANA
## 4861                              KRAFT FOODS
## 4862                                 SABRITAS
## 4863                                 SABORMEX
## 4864                                  JUGOMEX
## 4865                                COCA COLA
## 4866                                     MARS
## 4867                                  FERRERO
## 4868                         MASTER FOODS USA
## 4869                                COCA COLA
## 4870                                COCA COLA
## 4871 FRITOS ENCANTO DE MONTERREY, S.A. DE C.V
## 4872                      PEPSI-COLA MEXICANA
## 4873                      PEPSI-COLA MEXICANA
## 4874                                COCA COLA
## 4875                              GRUPO BIMBO
## 4876                                   NESTLE
## 4877                                COCA COLA
## 4878                 PROCTER & GAMBLE COMPANY
## 4879                                   HENKEL
## 4880                                  FERRERO
## 4881                                COCA COLA
## 4882                              LA IMPERIAL
## 4883                      PEPSI-COLA MEXICANA
## 4884                                 SABRITAS
## 4885                                    JUMEX
## 4886                              KRAFT FOODS
## 4887                                COCA COLA
## 4888                      PEPSI-COLA MEXICANA
## 4889                                 SABRITAS
## 4890                      PEPSI-COLA MEXICANA
## 4891                              GRUPO BIMBO
## 4892                      PEPSI-COLA MEXICANA
## 4893                                COCA COLA
## 4894                                COCA COLA
## 4895                                 SABRITAS
## 4896                                COCA COLA
## 4897                          SIGMA ALIMENTOS
## 4898                    GRUPO INDUSTRIAL LALA
## 4899                                   HENKEL
## 4900                                COCA COLA
## 4901                              GRUPO BIMBO
## 4902                      PEPSI-COLA MEXICANA
## 4903                    GRUPO INDUSTRIAL LALA
## 4904                               LA CENTRAL
## 4905                                COCA COLA
## 4906                        COLGATE PALMOLIVE
## 4907                                   NESTLE
## 4908                      PEPSI-COLA MEXICANA
## 4909                      PEPSI-COLA MEXICANA
## 4910                                COCA COLA
## 4911                                    JUMEX
## 4912                    GRUPO INDUSTRIAL LALA
## 4913                      PEPSI-COLA MEXICANA
## 4914                      PEPSI-COLA MEXICANA
## 4915                      ABSORMEX S.A DE C.V
## 4916                        COLGATE PALMOLIVE
## 4917       PRODUCTOS VERDE VALLE S.A. DE C.V.
## 4918                                     ALEN
## 4919                      PEPSI-COLA MEXICANA
## 4920               FABRICA DE JABON LA CORONA
## 4921                                COCA COLA
## 4922                 PROCTER & GAMBLE COMPANY
## 4923                          SIGMA ALIMENTOS
## 4924                             GRUPO GAMESA
## 4925                                  MEXILAC
## 4926                    GRUPO INDUSTRIAL LALA
## 4927             JUGOS DEL VALLE S.A. DE C.V.
## 4928                      PEPSI-COLA MEXICANA
## 4929                      PEPSI-COLA MEXICANA
## 4930                                COCA COLA
## 4931                        COLGATE PALMOLIVE
## 4932                              GRUPO BIMBO
## 4933                         PRODUCTOS GERBER
## 4934                         PRODUCTOS GERBER
## 4935                        RECKITT BENCHISER
## 4936                         DANONE DE MEXICO
## 4937                         DANONE DE MEXICO
## 4938                                  CIGATAM
## 4939                              GRUPO BIMBO
## 4940                            CADBURY ADAMS
## 4941                         DANONE DE MEXICO
## 4942                      PEPSI-COLA MEXICANA
## 4943             JUGOS DEL VALLE S.A. DE C.V.
## 4944                                 SABRITAS
## 4945                      PEPSI-COLA MEXICANA
## 4946                              GRUPO BIMBO
## 4947                      PEPSI-COLA MEXICANA
## 4948                                 SABRITAS
## 4949          CERVECERIA CUAUHTEMOC MOCTEZUMA
## 4950                      PEPSI-COLA MEXICANA
## 4951                                COCA COLA
## 4952                                     LINK
## 4953                                COCA COLA
## 4954                      PEPSI-COLA MEXICANA
## 4955                       UNILEVER DE MEXICO
## 4956                              GRUPO BIMBO
## 4957                                COCA COLA
## 4958                        RECKITT BENCHISER
## 4959                      PEPSI-COLA MEXICANA
## 4960                BOTANAS LEO, S.A. DE C.V.
## 4961                         MASTER FOODS USA
## 4962                              GRUPO BIMBO
## 4963                              GRUPO BIMBO
## 4964                      PEPSI-COLA MEXICANA
## 4965                      PEPSI-COLA MEXICANA
## 4966                          SIGMA ALIMENTOS
## 4967                                COCA COLA
## 4968                                 SABRITAS
## 4969               FABRICA DE JABON LA CORONA
## 4970                    GRUPO INDUSTRIAL LALA
## 4971                               LA CENTRAL
## 4972                 PROCTER & GAMBLE COMPANY
## 4973                                 LA PERLA
## 4974                             GRUPO GAMESA
## 4975                      PEPSI-COLA MEXICANA
## 4976                                COCA COLA
## 4977                                 SABRITAS
## 4978                         DANONE DE MEXICO
## 4979                                COCA COLA
## 4980                        KELLOGG DE MEXICO
## 4981                                   NESTLE
## 4982                            CADBURY ADAMS
## 4983                                 SABRITAS
## 4984                                 SABRITAS
## 4985                                COCA COLA
## 4986                                COCA COLA
## 4987                      PEPSI-COLA MEXICANA
## 4988                       EMPACADORA JIMENEZ
## 4989                 PROCTER & GAMBLE COMPANY
## 4990                                 SABRITAS
## 4991                      PEPSI-COLA MEXICANA
## 4992                    GRUPO INDUSTRIAL LALA
## 4993                                     LINK
## 4994                        QUALTIA ALIMENTOS
## 4995                      PEPSI-COLA MEXICANA
## 4996                          SIGMA ALIMENTOS
## 4997                      PEPSI-COLA MEXICANA
## 4998                      PEPSI-COLA MEXICANA
## 4999                                COCA COLA
##                                      Producto Precio Ult.Costo Unidades
## 1                         Nutri Leche 1 Litro   16.0     12.31        1
## 2          DANUP STRAWBERRY P/BEBER 350GR NAL   14.0     14.00        1
## 3                         Rebanadas Bimbo 2Pz    5.0      5.00        1
## 4                            Pepsi N.R. 400Ml    8.0      8.00        1
## 5               Detergente Blanca Nieves 500G   19.5     15.00        1
## 6               Flash Xtra Brisa Marina 500Ml    9.5      7.31        1
## 7         Danone Bipack Fresa Chocoarroz 130G   11.0     11.00        1
## 8                        Jabon Zote Rosa 200G    9.5      7.31        1
## 9    T Femenina Princess Nocturna C/Alas 8Pza   23.5     18.08        1
## 10            Jugo De Durazno Del Valle 413Ml   12.0     12.00        1
## 11                           Pepsi N. R. 2.5L   27.0     27.00        1
## 12                            Valle Frut 2.5L   33.0     33.00        1
## 13                           Pepsi N. R. 2.5L   27.0     27.00        1
## 14            Principe Marinela Chocolate 85G   13.0     10.00        1
## 15                            Leche Lala 1.8L   33.0     33.00        1
## 16                           Mamut Gamesa 44G    6.0      4.62        1
## 17                      Leche Lala Premium 1L   20.0     20.00        1
## 18                        Detergente Ace 500G   21.0     16.15        1
## 19                      Leche Lala Premium 1L   20.0     20.00        1
## 20            Ensueño Bebe Ternura-Suav 850Ml   21.0     16.15        2
## 21                 Tocino Ahumado Chimex 170G   44.0     44.00        1
## 22                        Nutri Leche 1 Litro   16.0     12.31        1
## 23                Pulpy Mango del Valle 400ml   12.0     12.00        1
## 24                 Coca Cola Retornable 500Ml   10.0     10.00        1
## 25                    Napolitano Marinela 70G   10.0      7.69        1
## 26                       Coca Cola N.R. 500Ml   13.0     13.00        1
## 27                   Nectar Mango Jumex 450Ml   12.5     12.50        1
## 28                          Sprite N.R. 600Ml   14.0     14.00        1
## 29                 Queso Americano Nutrileche   14.5     14.50        2
## 30         Jamon De Pavo Virginia Fud 250 Grs   49.0     49.00        1
## 31                           Pepsi N. R. 2.5L   27.0     27.00        1
## 32                          Nutri Leche 1.89L   29.0     29.00        1
## 33                         Barritas Fresa 64G   10.0      7.69        1
## 34                  PERMA SHARP RASTRILLO 1PZ   10.5     10.50        1
## 35                     Joya Ponche N.R. 500Ml   13.0     13.00        1
## 36                        Nutri Leche 1 Litro   16.0     12.31        1
## 37                          Coca Cola N.R. 2L   28.0     28.00        1
## 38                    Medias Noches Bimbo 8Pz   27.0     20.77        1
## 39                 Coca Cola Retornable 500Ml   10.0     10.00        1
## 40                    Coca Cola Regular 355Ml    9.0      9.00        2
## 41                      Pan Blanco Bimbo 650G   32.0     24.62        1
## 42           Tostadas El Gallo De Oro 90pzas.   49.0     37.69        1
## 43                       Coca Cola N. R. 2.5L   34.0     34.00        1
## 44                    Blanqueador Cloralex 1L   13.0     10.00        1
## 45                  Coca Cola Retornable 2.5L   27.0     27.00        1
## 46              Yoghurt  Beber Fresa Ypt 220G   10.0     10.00        1
## 47                           Pepsi N. R. 2.5L   27.0     27.00        1
## 48   SAVILE COLAGENO PULPA SABILA ANTIESPONJA   10.5     10.50        1
## 49                  Coca Cola Retornable 1.5L   18.0     18.00        1
## 50                            Valle Frut 2.5L   33.0     33.00        1
## 51                           Pepsi N. R. 2.5L   27.0     27.00        1
## 52                          Ruffles Queso 50G   13.0     13.00        1
## 53              Sabritas Crema Y Especies 45G   13.0     13.00        1
## 54                       Coca Cola N. R. 2.5L   34.0     34.00        1
## 55                          Nutri Leche 1.89L   29.0     29.00        1
## 56                            Pepsi N.R. 1.5L   18.0     18.00        1
## 57                 Coca Cola Retornable 500Ml   10.0     10.00        1
## 58   Queso Crema Philladelphia Barra 190G Kft   37.0     37.00        1
## 59                    Cheetos Flaming Hot 48g    8.0      8.00        1
## 60                       Coca Cola N.R. 500Ml   13.0     13.00        3
## 61                       Coca Cola N. R. 2.5L   34.0     34.00        1
## 62                            Pepsi N.R. 1.5L   18.0     18.00        1
## 63                      Leche Lala Premium 1L   20.0     20.00        1
## 64                              Pepsi N.R. 3L   34.0     34.00        1
## 65                              Pepsi N.R. 3L   34.0     34.00        1
## 66                 Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 67                       Coca Cola Zero 600Ml   14.0     14.00        1
## 68              Detergente Blanca Nieves 500G   19.5     15.00        1
## 69                    Nectar Manz Jumex 250Ml    8.0      8.00        1
## 70                    Blanqueador Cloralex 1L   13.0     10.00        1
## 71                    Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 72                    Cheetos Flaming Hot 48g    8.0      8.00        1
## 73                  Kinder Maxi Chocolate 21G    8.0      6.15        2
## 74                       Coca Cola N.R. 600Ml   14.0     14.00        1
## 75                          Frutimax Limon 7g    3.5      3.50        1
## 76                     Pringles Original 37G.   14.0     10.77        2
## 77             Cremax De Nieve Chocolate 90Gr   12.0      9.23        2
## 78                                 Epura 1.5L   13.0     13.00        1
## 79                        Arroz Diamante 900g   35.0     26.92        1
## 80                 Coca Cola Retornable 500Ml   10.0     10.00        1
## 81                           Pepsi N. R. 2.5L   27.0     27.00        1
## 82         Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 83                            Pepsi N.R. 1.5L   18.0     18.00        1
## 84                         Doritos Nachos 53G   12.0     12.00        1
## 85                       Coca Cola N.R. 600Ml   14.0     14.00        1
## 86                    kola Loka Gotero 3.5 gr   22.5     22.50        1
## 87               Trident Yerbabuena 4´s 5.2gr    2.0      2.00        2
## 88                       Coca Cola N.R. 600Ml   14.0     14.00        1
## 89                 Coca Cola Retornable 500Ml   10.0     10.00        1
## 90                      Leche Lala Premium 1L   20.0     20.00        1
## 91                                Bonafont 1L   11.0     11.00        2
## 92                    Cheetos Flaming Hot 48g    8.0      8.00        1
## 93                            Pepsi N.R. 1.5L   18.0     18.00        1
## 94                  Coca Cola Retornable 2.5L   27.0     27.00        1
## 95       Flauta Pollo Cazo Mex 20 Pzas 324Grs   32.0     32.00        1
## 96                         Doritos Nachos 53G   12.0     12.00        1
## 97        Florentinas Fresa Y Mantequilla 83G   12.0      9.23        1
## 98                                 Epura 1.5L   13.0     13.00        1
## 99                      Orbit Polar Mint 5.6G    2.0      2.00        1
## 100                           Valle Frut 2.5L   33.0     33.00        1
## 101               Sabritas Papas Adobadas 45G   13.0     13.00        1
## 102                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 103             Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 104                          Pepsi N. R. 2.5L   27.0     27.00        1
## 105                      Coca Cola N.R. 1.75L   24.0     24.00        1
## 106                             Pepsi N.R. 3L   34.0     34.00        1
## 107                Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 108                  Tostitos Flaming Hot 70G   11.0      8.46        1
## 109             Detergente Blanca Nieves 250G   10.5      8.08        1
## 110                      Powerade Moras 600Ml   18.0     13.85        1
## 111                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 112     EGO ATTRACTION GEL FOR MEN BOTE 200ML   13.0     13.00        1
## 113                      CERA LIQ. NEGRO 60ML   10.0     10.00        1
## 114                            Pepsi N. R. 2L   22.0     22.00        1
## 115                           Pepsi N.R. 1.5L   18.0     18.00        1
## 116        Bubba Xtreme Paleta Mora Azul 17gr    5.0      5.00        1
## 117                   Lucas Panzon Sandia 38G    7.0      7.00        2
## 118                       Bubbaloo Menta 5.5G    1.5      1.15        2
## 119                     Pan Blanco Bimbo 650G   32.0     24.62        1
## 120                        Cigarros Link 20pz   25.0     19.23        1
## 121                           Valle Frut 2.5L   33.0     33.00        1
## 122                           Pepsi N.R. 1.5L   18.0     18.00        1
## 123                   Lucas Panzon Sandia 38G    7.0      7.00        1
## 124             Tostadas El Gallo De Oro 250G   19.0     14.62        1
## 125                   BEBIN SUPER MEDIANO 14P   39.0     30.00        1
## 126                   Medias Noches Bimbo 8Pz   27.0     20.77        2
## 127                   Medias Noches Bimbo 8Pz   27.0     20.77        1
## 128                               Bonafont 1L   11.0     11.00        1
## 129                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 130             PAÑAL BEBIN SUPER GRANDE 40PZ  115.0    115.00        1
## 131   DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        1
## 132                           Frutimax Uva 7g    3.5      3.50        1
## 133                            Pepsi N. R. 2L   22.0     22.00        1
## 134         Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 135                     Queso Panela Fud 200G   30.5     30.50        1
## 136                          Pepsi N.R. 600Ml   13.0     13.00        1
## 137                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 138                   Medias Noches Bimbo 8Pz   27.0     20.77        2
## 139                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 140              Salsa Catsup Del Monte 320gr   14.0     10.77        1
## 141                           Pepsi N.R. 1.5L   18.0     18.00        1
## 142             VELADORA SAN JUDAS TADEO 400G   31.5     24.23        1
## 143                           Pepsi N.R. 1.5L   18.0     18.00        1
## 144                         Pepsi N. R. 500Ml   10.0     10.00        1
## 145                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 146  PLATO CHAROLA TERMICA #66 CONVERMEX C/50   14.5     11.15        1
## 147            Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 148                       Paketaxo Queso 215g   36.0     27.69        1
## 149     Gall Flor de Naranjo Gamesa 4pz 100gr   12.0      9.23        2
## 150                           Pepsi N.R. 1.5L   18.0     18.00        1
## 151       Shampoo Mariposa Ropa Negra 940 Ml.   25.0     19.23        1
## 152                       Nutri Leche 1 Litro   16.0     12.31        1
## 153                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 154             Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 155                      Coca Cola N. R. 2.5L   34.0     34.00        1
## 156     Ensueño Max Frescura Primaveral 450ml   13.0     10.00        1
## 157                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 158           Principe Marinela Chocolate 85G   13.0     10.00        1
## 159                        Seven Up N.R. 1.5L   18.0     18.00        1
## 160                           Pepsi N.R. 1.5L   18.0     18.00        1
## 161             Sabritas Crema Y Especies 45G   13.0     13.00        1
## 162                          Pepsi N. R. 2.5L   27.0     27.00        1
## 163                Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 164                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 165           Principe Marinela Chocolate 85G   13.0     10.00        1
## 166                         Powerade Frutas1L   22.0     22.00        1
## 167                     Squirt Toronja 1.5 Lt   18.0     18.00        1
## 168                     Leche Lala Premium 1L   20.0     20.00        1
## 169                           Pepsi N.R. 1.5L   18.0     18.00        1
## 170                      Jabon Zote Rosa 200G    9.5      7.31        1
## 171              Vinagre Manzana Ciervo 355Ml    9.5      7.31        1
## 172                     Pan Blanco Bimbo 650G   32.0     24.62        1
## 173                     Joya Manzana N.R 1.5L   22.0     22.00        1
## 174             Yoghurt  Beber Fresa Ypt 220G   10.0     10.00        1
## 175              Sabritas Papas Con Limon 40G   13.0     13.00        1
## 176                   Coca Cola Vidrio 235 Ml    8.0      8.00        1
## 177                 Mirinda Naranja N.R. 1.5L   18.0     18.00        1
## 178                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 179                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 180              Knorr Caldo De Pollo 8 Cubos   19.0     19.00        1
## 181                Jabon Axion Liquido 280ml.   16.5     12.69        1
## 182                    Cheetos Torciditos 48g    8.0      8.00        1
## 183                Detergente Foca Liquido 1L   31.5     24.23        1
## 184                           Valle Frut 2.5L   33.0     33.00        1
## 185                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 186                        Cigarros Link 20pz   25.0     19.23        1
## 187                     Doritos Incognita 47G   13.0     13.00        2
## 188                 Leche Negrito Bimbo 236Ml   10.0     10.00        1
## 189           Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 190                 Bimbochitos vainilla 69 g   10.0     10.00        1
## 191              Bran Frut Barra De Fresa 40G    8.0      8.00        1
## 192                  Pake Taxo Flaminhut 70gr   11.0      8.46        1
## 193                       Ruedas Bokados 100G   18.0     13.85        1
## 194                           Pepsi N.R. 1.5L   18.0     18.00        1
## 195         Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 196                           Pepsi N.R. 1.5L   18.0     18.00        1
## 197                    Tang Sabor Naranja 15g    5.0      5.00        1
## 198                           Pepsi N.R. 1.5L   18.0     18.00        1
## 199   Papel Higienico Jumbo 455hojas Rollos 4   26.0     20.00        1
## 200              Cacahuate Salado Bokados 90G   12.0      9.23        1
## 201                 Giro Chocolate Gamesa 95g   12.0      9.23        5
## 202           Prispas A La Francesa Boka2 50G   10.0      7.69        1
## 203                 Ruffles Papas Con Sal 45G   13.0     13.00        1
## 204                        Doritos Nachos 53G   12.0     12.00        1
## 205                           Pepsi N.R. 1.5L   18.0     18.00        1
## 206          VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        1
## 207                  CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 208                     Pan Blanco Bimbo 650G   32.0     24.62        1
## 209   Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        2
## 210                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 211                  Gelatina Dany Fresa 125G    6.5      6.50        1
## 212                     Doritos Incognita 47G   13.0     13.00        1
## 213                Leche Hersheys Fresa 236Ml   11.5     11.50        1
## 214                   Gelatina Dany Piña 125G    6.5      6.50        1
## 215                         Ruffles Queso 50G   13.0     13.00        1
## 216                           Rancheritos 52g   11.0     11.00        1
## 217          Chicharron De Cerdo Sabritas 30G   12.0      9.23        1
## 218                  Manzanita Sol N.R. 600Ml   13.0     13.00        1
## 219                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 220                          Pepsi N.R. 400Ml    8.0      8.00        1
## 221            Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 222                      Coca Cola N.R. 500Ml   13.0     13.00        1
## 223                          Pepsi N. R. 2.5L   27.0     27.00        1
## 224                            Big Cola 500Ml    8.0      8.00        1
## 225                       V8 Campbell´S 340Ml   11.0     11.00        1
## 226                 Tix Tix Chupabarritas 12g    4.0      4.00        1
## 227                           Pepsi N.R. 1.5L   18.0     18.00        1
## 228                        Cigarros Link 20pz   25.0     19.23        2
## 229                     Joya Manzana N.R 1.5L   22.0     22.00        1
## 230                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 231                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 232                      Coca Cola N.R. 500Ml   13.0     13.00        1
## 233                      Gansito Marinela 50G   10.0      7.69        1
## 234                             Pepsi N.R. 3L   34.0     34.00        1
## 235                      Sal De Uvas Picot 5G    3.5      3.50        1
## 236               Sabritones Chile Limón 60gr   10.0      7.69        1
## 237         Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 238                  Pake Taxo Flaminhut 70gr   11.0      8.46        1
## 239                            Pepsi N. R. 2L   22.0     22.00        1
## 240             Detergente Blanca Nieves 500G   19.5     15.00        1
## 241  Acondicionador De Telas Fresco Sol 850Ml   25.0     19.23        1
## 242                       Rebanadas Bimbo 2Pz    5.0      5.00        3
## 243                Blanqueador Cloralex 500Ml    8.0      6.15        1
## 244                       Papatinas Fuego 25G    7.0      5.38        1
## 245  Yoghurt Bebible Licuado Fresa Nestle 500   19.0     19.00        1
## 246                            Pepsi N. R. 2L   22.0     22.00        1
## 247      Frutsi Sabor Ponche De Frutas 250 Ml    5.0      5.00        1
## 248                  Mirinda Naranja N. R. 2L   22.0     22.00        1
## 249               MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 250                       Aqua Frut Uva 600Ml    9.5      9.50        1
## 251                           Pepsi N.R. 1.5L   18.0     18.00        1
## 252               CREMA ENJUAGUE MONELI 220ML    7.0      5.38        1
## 253                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 254                     Leche Lala Premium 1L   20.0     20.00        1
## 255   DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        1
## 256                  Veladora Limonera Nevada   14.5     11.15        1
## 257                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 258                   Blanqueador Cloralex 1L   13.0     10.00        1
## 259                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 260                             Pepsi N.R. 3L   34.0     34.00        1
## 261   B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 262                       Detergente Ace 500G   21.0     16.15        1
## 263         Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 264                Blanqueador Cloralex 500Ml    8.0      6.15        1
## 265             Chicharron De Cerdo Boka2 30G   10.0      7.69        1
## 266  Acondicionador De Telas Fresco Sol 850Ml   25.0     19.23        1
## 267                      Frutsi Manzana 250Ml    5.0      5.00        1
## 268                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 269                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 270             Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 271        Bubba Xtreme Paleta Mora Azul 17gr    5.0      5.00        1
## 272                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 273                    Kinder Chocolate 12.5g    4.5      3.46        2
## 274                      Powerade Moras 600Ml   18.0     13.85        1
## 275     Raid Insecticida Casa Y Jardin 400 Ml   60.0     46.15        1
## 276            Nectar Manzana Del Valle 413Ml   12.0     12.00        2
## 277                         Ruffles Queso 50G   13.0     13.00        2
## 278                         Yoplait Mini 100G    5.0      5.00        1
## 279          Yoplait Mini Beber Durazno 100Gr    5.0      5.00        1
## 280                      Gansito Marinela 50G   10.0      7.69        1
## 281      LALA YOMI UHT FRESA CARTON 250ML NAL   11.5     11.50        2
## 282           Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 283                   Blanqueador Cloralex 1L   13.0     10.00        1
## 284        Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 285               MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 286              Bran Frut Barra De Fresa 40G    8.0      8.00        1
## 287                         Coca Cola N.R. 2L   28.0     28.00        1
## 288                    Powerade Lima-Limon 1L   22.0     22.00        1
## 289                       Aqua Frut Uva 600Ml    9.5      9.50        1
## 290        KLEEN BEBE SUAVELASTIC GRANDE 14PZ   58.0     58.00        1
## 291                           Pepsi N.R. 1.5L   18.0     18.00        1
## 292                                Epura 1.5L   13.0     13.00        1
## 293                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 294                            Pepsi N. R. 2L   22.0     22.00        1
## 295                        Doritos Nachos 53G   12.0     12.00        1
## 296                        Doritos Diablo 47G   12.0     12.00        1
## 297                           Pepsi N.R. 1.5L   18.0     18.00        1
## 298             VELADORA SAN JUDAS TADEO 400G   31.5     24.23        1
## 299                   Blanqueador Cloralex 1L   13.0     10.00        1
## 300                 Axion Limon Liquido 750ml   40.5     31.15        1
## 301                           Valle Frut 2.5L   33.0     33.00        1
## 302               Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 303            MARINELA ROCKO MOBI BOLSA 45GR    5.0      3.85        3
## 304                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 305                               Pinol 500Ml   15.0     11.54        1
## 306               MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        2
## 307                  Mirinda Naranja N. R. 2L   22.0     22.00        1
## 308                          Pepsi N. R. 2.5L   27.0     27.00        1
## 309      MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 310                    Joya Ponche N.R. 500Ml   13.0     13.00        1
## 311                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 312                     Squirt Toronja 1.5 Lt   18.0     18.00        1
## 313                        Doritos Nachos 53G   12.0     12.00        1
## 314                           Leche Lala 1.8L   33.0     33.00        1
## 315                 Mirinda Naranja N.R. 1.5L   18.0     18.00        1
## 316                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 317                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 318                           Pepsi N.R. 1.5L   18.0     18.00        1
## 319               Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 320                         Pepsi N. R. 500Ml   10.0     10.00        1
## 321                    Pinguinos Marinela 80G   15.0     11.54        1
## 322                    Negrito Duo Bimbo 124g   15.0     15.00        1
## 323             Detergente Blanca Nieves 500G   19.5     15.00        1
## 324                         Negrito Bimbo 62G   10.0     10.00        1
## 325                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 326                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 327                         Pepsi N. R. 500Ml   10.0     10.00        1
## 328                        Cigarros Link 20pz   25.0     19.23        1
## 329                     Doritos Incognita 47G   13.0     13.00        1
## 330                    Cheetos Torciditos 48g    8.0      8.00        1
## 331             Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 332                           Leche Lala 1.8L   33.0     33.00        1
## 333                         Powerade Moras 1L   22.0     16.92        1
## 334                          Pepsi N.R. 400Ml    8.0      8.00        1
## 335                             Pepsi N.R. 3L   34.0     34.00        1
## 336                           Pepsi N.R. 1.5L   18.0     18.00        1
## 337                           Pepsi N.R. 1.5L   18.0     18.00        1
## 338   DANUP COOKIES & CREAM P/BEBER 350GR NAL   14.0     14.00        1
## 339               Sabritas Papas Adobadas 45G   13.0     13.00        1
## 340                    Cheetos Torciditos 48g    8.0      8.00        1
## 341               Yoghurt Cereal Colores 100G    9.5      9.50        2
## 342        Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 343                          Pepsi Lata 355Ml   11.0     11.00        1
## 344                    Pringles Original 37G.   14.0     10.77        1
## 345                      Sponch Marinela 120G   15.0     11.54        1
## 346                         Negrito Bimbo 62G   10.0     10.00        1
## 347                             Pepsi N.R. 3L   34.0     34.00        1
## 348                     Conchitas Encanto 60G   10.0      7.69        1
## 349                Coca Cola Retornable 500Ml   10.0     10.00        2
## 350                    Pinguinos Marinela 80G   15.0     11.54        1
## 351             Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 352                Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 353                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 354                Mirinda Naranja N.R. 600Ml   13.0     13.00        1
## 355             Detergente Blanca Nieves 250G   10.5      8.08        1
## 356                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 357                           Pepsi N.R. 1.5L   18.0     18.00        1
## 358            Fabuloso Fresco Amanecer 500Ml   17.0     13.08        1
## 359               Semilla Girasol Bokados 40G    8.0      6.15        1
## 360             Chicharron De Cerdo Boka2 30G   10.0      7.69        1
## 361                Coca Cola Retornable 500Ml   10.0     10.00        1
## 362                           Pepsi N.R. 1.5L   18.0     18.00        1
## 363                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 364                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 365                          Pepsi N. R. 2.5L   27.0     27.00        1
## 366                      Coca Cola N.R. 500Ml   13.0     13.00        1
## 367           Salvo Detergente Líquido 300 ml   17.0     13.08        1
## 368          FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 369                Blanqueador Cloralex 250Ml    5.0      3.85        1
## 370                               Pinol 250Ml    9.0      6.92        1
## 371                          Pepsi N.R. 600Ml   13.0     13.00        1
## 372                  Veladora Limonera Nevada   14.5     11.15        1
## 373        Mantecadas Nuez Bimbo 6 Pzas 84.5g   18.0     18.00        1
## 374                          Pepsi N. R. 2.5L   27.0     27.00        1
## 375                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 376                  Nectar Mango Jumex 450Ml   12.5     12.50        1
## 377                          Pepsi N. R. 2.5L   27.0     27.00        1
## 378                         Coca Cola N.R. 2L   28.0     28.00        1
## 379                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 380                           Leche Lala 1.8L   33.0     33.00        1
## 381                  Aceite Vegetal 1-2-3 1Lt   37.0     28.46        1
## 382        Detergente Salvo Microesferas 500G   24.0     18.46        1
## 383           Jugo De Durazno Del Valle 413Ml   12.0     12.00        1
## 384            Nectar Manzana Del Valle 413Ml   12.0     12.00        1
## 385                   Agua Mineral N.R. 591Ml   15.0     15.00        1
## 386                     Pan Blanco Bimbo 650G   32.0     24.62        1
## 387   DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        1
## 388                 Ruffles Papas Con Sal 45G   13.0     13.00        1
## 389                        Doritos Nachos 53G   12.0     12.00        1
## 390                          Pepsi Lata 355Ml   11.0     11.00        1
## 391                      Coca Cola N.R. 500Ml   13.0     13.00       14
## 392                             Pepsi N.R. 3L   34.0     34.00        1
## 393                             Pepsi N.R. 3L   34.0     34.00        1
## 394                          Pepsi N.R. 400Ml    8.0      8.00        1
## 395                           Pepsi N.R. 1.5L   18.0     18.00        1
## 396                           Pepsi N.R. 1.5L   18.0     18.00        1
## 397                           Pepsi N.R. 1.5L   18.0     18.00        1
## 398                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 399                               Pinol 250Ml    9.0      6.92        1
## 400                         Ruffles Queso 50G   13.0     13.00        1
## 401             Detergente Blanca Nieves 500G   19.5     15.00        1
## 402                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 403                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 404                     Leche Lala Premium 1L   20.0     20.00        1
## 405                     Conchitas Encanto 60G   10.0      7.69        2
## 406                  NECTAR MANGO JUMEX 250ML    8.0      8.00        2
## 407       Naturella con Manzanilla 10 toallas   17.0     13.08        1
## 408                  Tostitos Flaming Hot 70G   11.0      8.46        1
## 409                        Doritos Nachos 53G   12.0     12.00        1
## 410                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 411             Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 412                          Pepsi N. R. 2.5L   27.0     27.00        1
## 413                           Rancheritos 52g   11.0     11.00        1
## 414                           Valle Frut 2.5L   33.0     33.00        1
## 415                      Tang Sabor Fresa 15g    5.0      5.00        1
## 416               Naranjada Jumex Frutzo 1.5L   18.0     18.00        1
## 417                        Cigarros Link 20pz   25.0     19.23        1
## 418          VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        1
## 419                       MAIZENA NATURAL 95G   11.0      8.46        1
## 420         Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 421    PINTURA CABALLITO AZUL MARINO N°15 13G   14.5     11.15        2
## 422              COLORANTE FIJO CABALLITO 18G   14.5     11.15        2
## 423                Blanqueador Cloralex 250Ml    5.0      3.85        1
## 424                     Pan Blanco Bimbo 650G   32.0     24.62        1
## 425                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 426                    Tang Sabor Jamaica 15g    5.0      3.85        1
## 427                       Tang Sabor Piña 15g    5.0      5.00        1
## 428                Coca Cola Retornable 500Ml   10.0     10.00        1
## 429        Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 430        Mayonesa Hellmann´S Con Limon 190G   16.0     12.31        1
## 431                          Pepsi N. R. 2.5L   27.0     27.00        1
## 432                     Joya Manzana N.R 1.5L   22.0     22.00        1
## 433                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 434                         Pepsi N. R. 500Ml   10.0     10.00        1
## 435                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 436                Coca Cola Retornable 500Ml   10.0     10.00        2
## 437                            Tang Mango 15G    5.0      5.00        1
## 438                         Powerade Moras 1L   22.0     16.92        1
## 439                   Topitos 360 Bokados 60G   10.0      7.69        1
## 440                           Flash Floral 1L   16.0     12.31        1
## 441                   Medias Noches Bimbo 8Pz   27.0     20.77        2
## 442                      Coca Cola N. R. 2.5L   34.0     34.00        1
## 443                   Medias Noches Bimbo 8Pz   27.0     20.77        1
## 444                           Pepsi N.R. 1.5L   18.0     18.00        1
## 445                     Del Valle Mango 250Ml    8.0      8.00        1
## 446                          Pepsi N. R. 2.5L   27.0     27.00        1
## 447        Churritos Leo Frituras De Maíz 60G   10.0      7.69        1
## 448                      Coca Cola N.R. 600Ml   14.0     14.00        2
## 449                       Rebanadas Bimbo 2Pz    5.0      5.00        1
## 450                           Rancheritos 52g   11.0     11.00        1
## 451                 PERMA SHARP RASTRILLO 1PZ   10.5     10.50        2
## 452                          Pepsi N. R. 2.5L   27.0     27.00        1
## 453                           Pepsi N.R. 1.5L   18.0     18.00        1
## 454                     Joya Fresa N.R 600 Ml   14.0     14.00        1
## 455                         Fanta N. R. 500Ml   13.0     13.00        1
## 456                       ARROZ DIAMANTE 225G    9.0      6.92        1
## 457                       MAIZENA NATURAL 95G   11.0      8.46        1
## 458                          Kinder Bueno 43G   21.0     16.15        1
## 459                      Powerade Moras 600Ml   18.0     13.85        2
## 460                      Detergente Roma 250G   10.0      7.69        1
## 461                         Negrito Bimbo 62G   10.0     10.00        1
## 462                    Jabon Zote Blanco 200G    9.5      7.31        1
## 463                      Coca Cola N. R. 2.5L   34.0     34.00        1
## 464                Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 465                        Barritas Fresa 64G   10.0      7.69        1
## 466                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 467             Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 468                        Seven Up N.R. 1.5L   18.0     18.00        1
## 469                           Pepsi N.R. 1.5L   18.0     18.00        1
## 470                      Tang Sabor Fresa 15g    5.0      5.00        1
## 471                  Manzanita Sol N.R. 600Ml   13.0     13.00        1
## 472                            Tang Melón 15g    5.0      5.00        1
## 473                         Negrito Bimbo 62G   10.0     10.00        1
## 474                           Pepsi N.R. 1.5L   18.0     18.00        1
## 475            Nectar Manzana Del Valle 250Ml    8.0      8.00        2
## 476                  Veladora Limonera Nevada   14.5     11.15        2
## 477                         Ruffles Queso 50G   13.0     13.00        1
## 478                        Agua Mineral 355Ml    9.0      9.00        1
## 479                            Pepsi N. R. 2L   22.0     22.00        1
## 480                           Pepsi N.R. 1.5L   18.0     18.00        1
## 481           Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 482             Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 483                     Squirt Toronja 1.5 Lt   18.0     18.00        1
## 484                          Pepsi N. R. 2.5L   27.0     27.00        1
## 485                 MASECA HARINA DE MAIZ 1KG   17.0     13.08        1
## 486                 MANTECA VEGETAL INCA 250G   16.5     12.69        1
## 487                     Saladitas Gamesa 137G   13.0     10.00        1
## 488                   Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 489     Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 490                     Saladitas Gamesa 137G   13.0     10.00        1
## 491                Detrgente Líquido Roma 1Lt   28.0     21.54        1
## 492         Salsa Hunt's Pasta 4 Quesos 360gr   21.0     16.15        2
## 493                     Saladitas Gamesa 137G   13.0     10.00        1
## 494                  Tostitos Flaming Hot 70G   11.0      8.46        1
## 495                 Tix Tix Chupabarritas 12g    4.0      4.00        2
## 496                           Pepsi N.R. 1.5L   18.0     18.00        1
## 497            Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 498                           Pepsi N.R. 1.5L   18.0     18.00        1
## 499                            Pepsi N. R. 2L   22.0     22.00        1
## 500                Blanqueador Cloralex 500Ml    8.0      6.15        1
## 501                               Pinol 500Ml   15.0     11.54        1
## 502                             Big Cola 1.5L   15.0     15.00        2
## 503                           Pepsi N.R. 1.5L   18.0     18.00        1
## 504                             Pepsi N.R. 3L   34.0     34.00        1
## 505           Refresco De Toronja Fresca 2.5L   30.0     30.00        2
## 506                         Seven Up N. R. 2L   22.0     22.00        1
## 507                Coca Cola Retornable 500Ml   10.0     10.00        2
## 508                 Cerveza Tecate Light 16Oz   20.0     15.38        6
## 509               MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 510                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 511                             Pepsi N.R. 3L   34.0     34.00        1
## 512                 Kinder Maxi Chocolate 21G    8.0      6.15        2
## 513             Fabuloso Fresca Lavanda 500Ml   17.0     13.08        1
## 514        Detergente Salvo Microesferas 250G   12.0      9.23        1
## 515                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 516                Pastilla Flash Lavanda 72G   15.0     11.54        1
## 517                     Queso Sierra 250G Lvi   35.0     35.00        1
## 518                   Cloralex Mascotas 950ml   26.0     20.00        1
## 519                  Flash Xtra Lavanda 500Ml    9.5      7.31        1
## 520                             Pepsi N.R. 3L   34.0     34.00        1
## 521         Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 522                     Pan Blanco Bimbo 650G   32.0     24.62        1
## 523                             Pepsi N.R. 3L   34.0     34.00        1
## 524                 Mirinda Naranja N.R. 1.5L   18.0     18.00        1
## 525   Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 526                          Pepsi N. R. 2.5L   27.0     27.00        1
## 527                           Pepsi N.R. 1.5L   18.0     18.00        1
## 528                    Cheetos Torciditos 48g    8.0      8.00        2
## 529            Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 530                            Pepsi N. R. 2L   22.0     22.00        1
## 531      Tinte garnier Nut 677Choc Silvia 65G   50.0     50.00        1
## 532                    Tang Sabor Naranja 15g    5.0      5.00        1
## 533      MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 534                          Pepsi N. R. 2.5L   27.0     27.00        1
## 535                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 536                          Pepsi N. R. 2.5L   27.0     27.00        1
## 537                             Pepsi N.R. 3L   34.0     34.00        1
## 538                      Coca Cola N.R. 1.75L   24.0     24.00        1
## 539              Valle Frut Citrus Punch 1.5L   22.0     22.00        1
## 540                          Pepsi N. R. 2.5L   27.0     27.00        1
## 541                          Pepsi N. R. 2.5L   27.0     27.00        1
## 542                         Powerade Moras 1L   22.0     16.92        1
## 543                         Pepsi N. R. 500Ml   10.0     10.00        1
## 544                          Pepsi N. R. 2.5L   27.0     27.00        1
## 545                            Pepsi N. R. 2L   22.0     22.00        1
## 546                         Tang Horchata 15G    5.0      5.00        1
## 547                          Pepsi N.R. 400Ml    8.0      8.00        1
## 548                     Doritos Incognita 47G   13.0     13.00        1
## 549                             Pepsi N.R. 3L   34.0     34.00        1
## 550                 Jarrito Tutti Frutti 1.5L   16.0     12.31        1
## 551                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 552             Jarritos Sabor Mandarina 1.5L   16.0     16.00        1
## 553               Pall Mall Ibiza Sunzet 20'S   56.0     43.08        1
## 554                  ATÉn El Dorado Agua 140g   13.5     10.38        3
## 555                         Pepsi N. R. 500Ml   10.0     10.00        1
## 556       Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 557                   Senzo Mix Chocolate 93G   12.0      9.23        1
## 558                       Rebanadas Bimbo 2Pz    5.0      5.00        1
## 559                    Fritos Sal Y Limón 47G    9.0      6.92        1
## 560                        Doritos Nachos 53G   12.0     12.00        1
## 561                 Cerveza Tecate Light 16Oz   20.0     15.38        3
## 562                          Pepsi N.R. 600Ml   13.0     13.00        1
## 563        CHIPOTLES ADOBADOS LA COSTEÑA 105G   11.5      8.85        1
## 564                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 565                  Gelatina Dany Limon 125G    6.5      6.50        1
## 566                   Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 567   DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        1
## 568                        Paketaxo Queso 65G   11.0      8.46        1
## 569                         Powerade Frutas1L   22.0     22.00        1
## 570                        Mazapán Azteca 30G    3.0      2.31        2
## 571                 Tix Tix Chupabarritas 12g    4.0      4.00        1
## 572                      Lenteja Nor-Ver 500G   15.0     11.54        1
## 573                      Frutsi Manzana 250Ml    5.0      5.00        1
## 574                    Queso Panela Lala 200G   40.0     40.00        1
## 575                     Crema Norteñita 250ml   20.0     15.38        1
## 576                        Boing de Uva 500ml   11.5      8.85        2
## 577                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 578                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 579               M&M Chocolate Display 47.9G   15.0     11.54        1
## 580                        Sprite N. R. 500Ml   13.0     10.00        1
## 581                     Leche Lala Premium 1L   20.0     20.00        1
## 582              Aceite Vegetal Cristal 500Ml   18.0     13.85        1
## 583               Sabritones Chile Limón 60gr   10.0      7.69        1
## 584               Palomitas Poffets Queso 26G    8.0      6.15        1
## 585                    Cheetos Torciditos 48g    8.0      8.00        1
## 586                   Medias Noches Bimbo 8Pz   27.0     20.77        2
## 587            MARINELA ROCKO MOBI BOLSA 45GR    5.0      3.85        1
## 588                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 589        PRESTOBARBA ULTRAGRIP GILLETTE 1PZ   18.0     18.00        1
## 590                 PERMA SHARP RASTRILLO 1PZ   10.5     10.50        1
## 591                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 592                           Valle Frut 2.5L   33.0     33.00        1
## 593                    Cheetos Torciditos 48g    8.0      8.00        1
## 594            Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 595                          Pepsi N.R. 600Ml   13.0     13.00        1
## 596                     Saladitas Gamesa 137G   13.0     10.00        3
## 597                     Leche Lala Premium 1L   20.0     20.00        1
## 598                           Pepsi N.R. 1.5L   18.0     18.00        1
## 599                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 600                                  Epura 1L   10.0      7.69        1
## 601                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 602              Crema Acidificada Lala 200Ml   15.5     15.50        1
## 603                          Pepsi N. R. 2.5L   27.0     27.00        1
## 604          VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        2
## 605                 Nescafé Clásico sobre 42g   25.0     25.00        1
## 606              Bran Frut Barra De Fresa 40G    8.0      8.00        1
## 607                      Cheese Puffs Leo 45G    6.0      4.62        2
## 608                       Nutri Leche 1 Litro   16.0     12.31        1
## 609                      Jabon Zote Rosa 200G   10.0      7.69        2
## 610               PAPEL HIGIENICO PREMIER 4PZ   28.0     21.54        1
## 611    Crema Dental Colgate Tripe Acción 50ml   17.0     13.08        1
## 612           CREMA DENTAL TRIPLE Acción 75ML   19.0     14.62        1
## 613                  Speed Stick Roll On 30ml   11.5     11.50        1
## 614          Crema Colgate Trip/Acc Blanc 50g   11.0      8.46        1
## 615                     Tostadas Morelos 50Pz   28.0     21.54        1
## 616                      Cacahuate Salado 45G    8.0      6.15        1
## 617         Cacahuates Enchilados Bokados 45G    8.0      6.15        1
## 618                    Manzanita Sol N. R. 2L   18.0     13.85        1
## 619         RAJAS DE Jalapeño LA COSTEÑA 105G    7.0      5.38        1
## 620                             Pepsi N.R. 3L   34.0     34.00        1
## 621                     Saladitas Gamesa 137G   13.0     10.00        2
## 622                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 623              Mantequilla Lala Sin Sal 90G   15.5     11.92        1
## 624                             Pepsi N.R. 3L   34.0     34.00        1
## 625                            Tang Melón 15g    5.0      5.00        1
## 626                      Zuko Sabor Mango 15G    5.0      5.00        1
## 627                     Tostadas Morelos 50Pz   28.0     21.54        1
## 628                            Pepsi N. R. 2L   22.0     22.00        1
## 629               MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 630              Clamato estilo cubano 473 ml   20.5     20.50        1
## 631         Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 632           Pake Taxo Sabritas Botanero 65G   11.0      8.46        1
## 633                   Pan Bimbo Integral 720G   37.0     28.46        1
## 634                    Cheetos Torciditos 48g    8.0      8.00        1
## 635                 MASECA HARINA DE MAIZ 1KG   17.0     13.08        1
## 636                      Coca Cola N. R. 2.5L   34.0     34.00        1
## 637            Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 638                  MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 639                         Ruffles Queso 50G   13.0     13.00        1
## 640                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 641                         Ruffles Queso 50G   13.0     13.00        2
## 642                           Pepsi N.R. 1.5L   18.0     18.00        1
## 643                      Coca Cola N. R. 2.5L   34.0     34.00        1
## 644                             Clamato 296Ml   12.5     12.50        1
## 645                            Pepsi N. R. 2L   22.0     22.00        1
## 646                          Pepsi N. R. 2.5L   27.0     27.00        1
## 647                  CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 648        Gatorade De Ponche De Frutas 600Ml   21.0     21.00        1
## 649             Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 650                      Coca Cola N.R. 1.75L   24.0     24.00        1
## 651                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 652                          Pepsi N. R. 2.5L   27.0     27.00        1
## 653                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 654                             Pepsi N.R. 3L   34.0     34.00        1
## 655        Sopa De Fideos Con Pollo Knorr 95G   13.0     10.00        1
## 656                     Sopa Letras Knorr 95G   13.0     10.00        1
## 657              Fideos Knorr Chile Limon 95g   13.0     10.00        1
## 658               MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 659                 MASECA HARINA DE MAIZ 1KG   17.0     13.08        1
## 660                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 661                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 662           Jugo De Durazno Del Valle 413Ml   12.0     12.00        1
## 663                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 664                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 665                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 666                 Leche Negrito Bimbo 236Ml   10.0     10.00        2
## 667    Salsa Picante Clasica La Botanera 525G   11.5      8.85        1
## 668                         Negrito Bimbo 62G   10.0     10.00        1
## 669                     Squirt Toronja 1.5 Lt   18.0     18.00        2
## 670                             Pepsi N.R. 3L   34.0     34.00        1
## 671                     Squirt Toronja 1.5 Lt   18.0     18.00        1
## 672                 Salsa En Polvo Tajin 150G   30.5     30.50        1
## 673                   Agua Mineral N. R. 1.5L   23.0     23.00        1
## 674                           Pepsi N.R. 1.5L   18.0     18.00        1
## 675           Refresco De Toronja Fresca 2.5L   30.0     30.00        1
## 676                         Sprite N. R. 2.5L   30.0     30.00        1
## 677                          Pepsi N. R. 2.5L   27.0     27.00        1
## 678                        Cigarros Link 20pz   25.0     19.23        1
## 679                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 680                   Salsa De La Viuda 150Ml   16.5     12.69        1
## 681                Coca Cola Retornable 500Ml   10.0     10.00        5
## 682                         Coca Cola N.R. 2L   28.0     28.00        1
## 683                     Achiote La Anita 110G   12.0      9.23        1
## 684                  Tortillas del Hogar 320g   12.0      9.23        1
## 685                   Naturella Nocturna 10Pz   23.0     17.69        1
## 686                   Joya Manzana N.R. 500Ml   13.0     13.00        1
## 687                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 688                          Pepsi N. R. 2.5L   27.0     27.00        1
## 689         TEQUILA REPOSADO EL JIMADOR 950ML  260.0    200.00        1
## 690           Refresco De Toronja Fresca 2.5L   30.0     30.00        2
## 691                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 692             Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 693                      Coca Cola N.R. 1.75L   24.0     24.00        1
## 694                 MANTECA VEGETAL INCA 250G   16.5     12.69        1
## 695                 PERMA SHARP RASTRILLO 1PZ   10.5     10.50        1
## 696                    Zuko Sabor Manzana 15G    5.0      5.00        2
## 697     Refresco Sin Gas Uva Jumex Fresh 2 Lt   21.0     21.00        1
## 698                          Pepsi N. R. 2.5L   27.0     27.00        1
## 699             Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 700          Strips Bokados Queso Y Chile 75G   10.0      7.69        1
## 701                           Bokados Mix 90G   12.0      9.23        1
## 702                   Aqua Frut Naranja 600Ml    9.5      9.50        1
## 703             Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 704                        Cigarros Link 20pz   25.0     19.23        1
## 705      LALA YOMI UHT FRESA CARTON 250ML NAL   11.5     11.50        2
## 706           Danonino Maxi Fresa Danone 170G    8.0      8.00        1
## 707               Danonino Fresa Bebible 90gr    5.0      5.00        1
## 708               MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 709                 Queso Oaxaca Camelia 200G   29.5     29.50        1
## 710                  MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 711                        Mazapán Azteca 30G    3.0      2.31        1
## 712                 Kinder Maxi Chocolate 21G    8.0      6.15        1
## 713                        Cigarros Link 20pz   25.0     19.23        1
## 714             Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 715                      Sponch Marinela 120G   15.0     11.54        1
## 716                   Agua Mineral N. R. 1.5L   23.0     23.00        1
## 717                    Pan Tostado Bimbo 210G   22.0     16.92        1
## 718                     Leche Lala Premium 1L   20.0     20.00        1
## 719                          Volt Lata 473 ml   17.0     13.08        1
## 720                   Del Valle Durazno 500Ml   13.0     13.00        1
## 721                  Tostitos Flaming Hot 70G   11.0      8.46        1
## 722                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 723                     Squirt Toronja 1.5 Lt   18.0     18.00        2
## 724         VELADORA VIRGEN DE GUADALUPE 400G   31.5     24.23        1
## 725                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 726                    Churrumais Flamas 60g.    7.0      5.38        1
## 727                  Veladora Limonera Nevada   14.5     11.15        1
## 728                    Gelatina Dany Uva 125G    6.5      6.50        1
## 729                         Coca Cola N.R. 2L   28.0     28.00        1
## 730              Semilla Calabaza Bokados 25G   11.0      8.46        1
## 731                         Ruffles Queso 50G   13.0     13.00        1
## 732                    Kinder Chocolate 12.5g    4.5      3.46        4
## 733                      Coca Cola N.R. 1.75L   24.0     24.00        1
## 734                         Negrito Bimbo 62G   10.0     10.00        1
## 735                           Pepsi N.R. 1.5L   18.0     18.00        1
## 736                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 737                    Tang Sabor Jamaica 15g    5.0      3.85        2
## 738                  Manzanita Sol N.R. 600Ml   13.0     13.00        1
## 739         Lala Sin Lactosa Descremada 21 lt   26.0     26.00        1
## 740           Jamón Americano De Pavo 170 Grs   29.0     29.00        1
## 741                        Paketaxo Queso 65G   11.0      8.46        1
## 742             Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 743                           Pepsi N.R. 1.5L   18.0     18.00        1
## 744                         Powerade Frutas1L   22.0     22.00        1
## 745                     Joya Manzana R. 500Ml   10.0     10.00        1
## 746             Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 747                         Ruffles Queso 50G   13.0     13.00        1
## 748                 Ruffles Papas Con Sal 45G   13.0     13.00        1
## 749                         Powerade Moras 1L   22.0     16.92        1
## 750      MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 751       9PRINGLES EXTRA HOT PAPAS BOTE 40GR   14.0     10.77        1
## 752                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 753              LECHE NIDO KINDER BOLSA 114G   26.0     26.00        1
## 754                       ARROZ DIAMANTE 225G    9.0      6.92        1
## 755                         Powerade Moras 1L   22.0     16.92        1
## 756                   Salsa De La Viuda 150Ml   16.5     12.69        1
## 757                     Leche Lala Premium 1L   20.0     20.00        1
## 758                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 759               MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 760         CREMA ENJUAGUE MONELI  ROSA 430ML   10.5      8.08        1
## 761     Papel Hig Color 360Hojas Dobles 4Pzas   22.0     16.92        1
## 762                         Powerade Frutas1L   22.0     22.00        1
## 763                           Pepsi N.R. 1.5L   18.0     18.00        1
## 764                  CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 765     Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 766                  Tostitos Flaming Hot 70G   11.0      8.46        1
## 767                Coca Cola Retornable 500Ml   10.0     10.00        1
## 768                        Doritos Nachos 53G   12.0     12.00        1
## 769                 PERMA SHARP RASTRILLO 1PZ   10.5     10.50        1
## 770      MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 771                        Paketaxo Queso 65G   11.0      8.46        1
## 772                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 773                               Pinol 250Ml    9.0      6.92        1
## 774                   Senzo Mix Chocolate 93G   12.0      9.23        1
## 775                     Saladitas Gamesa 137G   13.0     10.00        1
## 776                     Leche Lala Premium 1L   20.0     20.00        1
## 777                  Manzanita Sol N.R. 600Ml   13.0     13.00        1
## 778                     Pulpy Del Valle 400Ml   12.0     12.00        1
## 779                          Pepsi N. R. 2.5L   27.0     27.00        1
## 780                 MANTECA VEGETAL INCA 250G   16.5     12.69        1
## 781       HARINA DE ARROZ TRES ESTRELLAS 250G   10.0      7.69        2
## 782            Roles De Canela Glaseados 135G   14.0     10.77        1
## 783                   Yoghurt Fresa Lala 440G   16.5     16.50        1
## 784                    Canelitas Marinela 90G   13.0     10.00        1
## 785  NUTRIOLI ACEITE PURO DE SOYA BOT PLAS 85   30.5     23.46        1
## 786                     Leche Lala Premium 1L   20.0     20.00        1
## 787                      Coca Cola N.R. 600Ml   14.0     14.00        1
## 788                   Yoghurt Fresa Lala 440G   16.5     16.50        1
## 789                    Kinder Chocolate 12.5g    4.5      3.46        1
## 790                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 791  T Femenina Princess Nocturna C/Alas 8Pza   23.5     18.08        1
## 792                  Fanta Naranja N.R 600 Ml   14.0     10.77        1
## 793                                  Epura 1L   10.0      7.69        1
## 794               Yoghurt Cereal Colores 100G    9.5      9.50        1
## 795                 Bimbochitos vainilla 69 g   10.0     10.00        1
## 796                       Rebanadas Bimbo 2Pz    5.0      5.00        1
## 797                   Joya Manzana N. R. 2.5L   30.0     30.00        1
## 798                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 799                   Jugo Bida Manzana 500Ml   10.5     10.50        1
## 800                  Veladora Limonera Nevada   14.5     11.15        1
## 801                Coca Cola Retornable 500Ml   10.0     10.00        2
## 802                    Kinder Chocolate 12.5g    4.5      3.46        1
## 803                  Veladora Limonera Nevada   14.5     11.15        1
## 804                           Pepsi N.R. 1.5L   18.0     18.00        1
## 805                       Jugo Bida Uva 500Ml   10.5     10.50        1
## 806                   Jugo Bida Manzana 500Ml   10.5     10.50        1
## 807           Refresco De Toronja Fresca 2.5L   30.0     30.00        1
## 808                  Tostitos Flaming Hot 70G   11.0      8.46        1
## 809                   Senzo Mix Chocolate 93G   12.0      9.23        1
## 810               Naranjada Jumex Frutzo 1.5L   18.0     18.00        1
## 811                         Pepsi N. R. 500Ml   10.0     10.00        1
## 812                         Seven Up N. R. 2L   22.0     22.00        1
## 813                          Pepsi N. R. 2.5L   27.0     27.00        1
## 814                            Pepsi N. R. 2L   22.0     22.00        1
## 815                   Pan Bimbo Integral 720G   37.0     28.46        1
## 816          FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 817                      Coca Cola N.R. 500Ml   13.0     13.00        1
## 818                           Pepsi N.R. 1.5L   18.0     18.00        1
## 819                      Mole Doña Maria 235G   36.5     28.08        1
## 820             Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 821                   Cheetos Flaming Hot 48g    8.0      8.00        1
## 822                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 823                    Pinguinos Marinela 80G   15.0     11.54        1
## 824                             Pepsi N.R. 3L   34.0     34.00        1
## 825                  Hot-Nuts Multintenso 50G   10.0      7.69        1
## 826                          Pepsi N. R. 2.5L   27.0     27.00        1
## 827               Semilla Girasol Bokados 40G    8.0      6.15        3
## 828                     Leche Lala Premium 1L   20.0     20.00        1
## 829                           Pepsi N.R. 1.5L   18.0     18.00        1
## 830                      Leche Carnation 360G   19.0     14.62        1
## 831                      Barritas De Piña 64G   10.0      7.69        1
## 832                       Jugo Bida Uva 500Ml   10.5     10.50        1
## 833                      Coca Cola N.R. 500Ml   13.0     13.00        1
## 834      CHAMPINONES REBANADOS DEL MONTE 186G   17.0     13.08        1
## 835         Habaneras Integrales Gamesa 117Gr   11.0      8.46        1
## 836                   Joya Manzana N. R. 2.5L   30.0     30.00        1
## 837                Coca Cola Retornable 500Ml   10.0     10.00        6
## 838           Panquecitos C/Gota De Chocolate   15.0     11.54        1
## 839                           Leche Lala 1.8L   33.0     33.00        1
## 840                       Gel EGO black 250ml   18.5     18.50        1
## 841                  Leche Lala Premium 500Ml   12.0     12.00        1
## 842                         Negrito Bimbo 62G   10.0     10.00        1
## 843              Valle Frut Citrus Punch 1.5L   22.0     22.00        1
## 844                             Pepsi N.R. 3L   34.0     34.00        1
## 845                                Epura 1.5L   13.0     13.00        1
## 846                   MEDIA CREMA NESTLE 225G   16.0     12.31        1
## 847                         Ruffles Queso 50G   13.0     13.00        1
## 848                     Pulpy Del Valle 400Ml   12.0     12.00        1
## 849           Salvo Detergente Líquido 300 ml   17.0     13.08        1
## 850         Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 851                           Pepsi N.R. 1.5L   18.0     18.00        1
## 852                          Choco Lala 500Ml   17.0     17.00        1
## 853                       Rebanadas Bimbo 2Pz    5.0      5.00        1
## 854                  Canapinas Lara Tubo 115G   11.0      8.46        1
## 855                  Trikitrakes Marinela 69G   10.0      7.69        1
## 856                         Nutri Leche 1.89L   29.0     29.00        1
## 857       Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 858                        Agua Mineral 355Ml    9.0      9.00        2
## 859                       Jugo Bida Uva 500Ml   10.5     10.50        1
## 860                           Pepsi N.R. 1.5L   18.0     18.00        1
## 861                      Frutsi Manzana 250Ml    5.0      5.00        1
## 862                      Gansito Marinela 50G   10.0      7.69        1
## 863                         Negrito Bimbo 62G   10.0     10.00        1
## 864                             Pepsi N.R. 3L   34.0     34.00        1
## 865             Madalenas con Mantequilla 93g   13.0     10.00        1
## 866            Lara Deliciosas Vainilla 130 G   13.0     10.00        1
## 867                           Pepsi N.R. 1.5L   18.0     18.00        1
## 868                         Nutri Leche 1.89L   29.0     29.00        1
## 869                        Doritos Nachos 53G   12.0     12.00        1
## 870                           Pepsi N.R. 1.5L   18.0     18.00        1
## 871                  Kinder Sorpresa Niña 20g   21.0     16.15        1
## 872                          Pepsi N. R. 2.5L   27.0     27.00        1
## 873                   Agua Mineral N.R. 591Ml   15.0     15.00        2
## 874                   Coca Cola Regular 355Ml    9.0      9.00        1
## 875                          Pepsi N. R. 2.5L   27.0     27.00        1
## 876                           Pepsi N.R. 1.5L   18.0     18.00        1
## 877                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 878                Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 879                       Nutri Leche 1 Litro   16.0     12.31        1
## 880  DANONE ACTIVIA P/BEBER CIRUELA PASA 225G   11.5     11.50        1
## 881                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 882                Coca Cola Retornable 500Ml   10.0     10.00        1
## 883                        Doritos Nachos 53G   12.0     12.00        1
## 884      MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 885                             Pepsi N.R. 3L   34.0     34.00        1
## 886                             Pepsi N.R. 3L   34.0     34.00        1
## 887                         Ruffles Queso 50G   13.0     13.00        1
## 888                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 889              Cremax De Nieve Vainilla 90G   12.0      9.23        1
## 890           Nutri Yoghurt Fresa/Cereal 450g   12.5     12.50        1
## 891                           Pepsi N.R. 1.5L   18.0     18.00        1
## 892                           Pepsi N.R. 1.5L   18.0     18.00        1
## 893              Clamato estilo cubano 473 ml   20.5     20.50        1
## 894                Coca Cola Retornable 500Ml   10.0     10.00        1
## 895                         Ruffles Queso 50G   13.0     13.00        1
## 896                   Deliciosas Vainilla 90G    8.0      6.15        1
## 897                   Aqua Frut Manzana 600Ml    9.5      9.50        1
## 898               Deliciosas Mantequilla 130g   13.0     10.00        1
## 899                 Cerveza Tecate Light 16Oz   20.0     15.38        4
## 900                   Joya Manzana N. R. 2.5L   30.0     30.00        1
## 901             Cepillo Colgate Premier Clean   12.0     12.00        1
## 902              Bran Frut Barra De Fresa 40G    8.0      8.00        1
## 903              Fabuloso Fresca Primavera 1L   27.0     20.77        1
## 904                    Jabon Zote Blanco 100G    5.0      3.85        1
## 905        CHIPOTLES ADOBADOS LA COSTEÑA 220G   21.5     16.54        1
## 906     ELOTE DORADO EN GRANOS DEL MONTE 225G   10.0      7.69        1
## 907                             Pepsi N.R. 3L   34.0     34.00        1
## 908     CHICHAROS Y ZANAHORIAS DEL MONTE 215G   10.0      7.69        1
## 909     FRIJOLES BAYOS ENTEROS LA SIERRA 560G   18.0     13.85        1
## 910                        Arroz Nor Ver 900g   26.0     20.00        1
## 911             Aceite Vegetal Kartamus 900Ml   31.5     24.23        1
## 912                      Frutsi Manzana 250Ml    5.0      5.00        1
## 913                Coca Cola Retornable 500Ml   10.0     10.00        1
## 914           Pake Taxo Sabritas Botanero 65G   11.0      8.46        1
## 915                         Pepsi N. R. 500Ml   10.0     10.00        1
## 916         Shampoo Mariposa Ropa Negra 480Ml   14.5     11.15        1
## 917                   Dan Up Xtra Grande 450G   16.0     16.00        1
## 918            DANONE P/BEBER FRESA 220GR NAL   11.0     11.00        1
## 919                      Detergente Roma 250G   10.0      7.69        1
## 920                Jabon Zote Rosa Barra 100G    5.0      3.85        1
## 921                     Joya Manzana R. 500Ml   10.0     10.00        1
## 922                     Pan Blanco Bimbo 650G   32.0     24.62        1
## 923                           Pepsi N.R. 1.5L   18.0     18.00        1
## 924                           Pepsi N.R. 1.5L   18.0     18.00        1
## 925               Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 926                           Bimbuñuelos 99g   14.0     10.77        1
## 927                          Choco Lala 500Ml   17.0     17.00        1
## 928                       Aqua Frut Uva 600Ml    9.5      9.50        1
## 929                          Pepsi N.R. 600Ml   13.0     13.00        1
## 930           Jugo De Durazno Del Valle 413Ml   12.0     12.00        1
## 931                  Sal Refinada La Fina 1Kg   14.0     10.77        1
## 932                     Powerade Frutas 600Ml   18.0     18.00        1
## 933        Detergente Foca Biodegradable 500G   21.0     16.15        1
## 934                       Nutri Leche 1 Litro   16.0     12.31        1
## 935                     Powerade Frutas 600Ml   18.0     18.00        1
## 936                  Veladora Limonera Nevada   14.5     11.15        1
## 937                  Tostitos Flaming Hot 70G   11.0      8.46        1
## 938         RAJAS DE Jalapeño LA COSTEÑA 800G   29.5     22.69        1
## 939                  VASO CONVERMEX 16OZ 25PZ   20.0     15.38        1
## 940                     Conchas Tia Rosa 150G   14.0     10.77        1
## 941                 Cerillos Flama 115 Piezas    5.5      5.50        1
## 942               Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 943                          Pepsi N. R. 2.5L   27.0     27.00        1
## 944                   Medias Noches Bimbo 8Pz   27.0     20.77        1
## 945                  Tortillas del Hogar 320g   12.0      9.23        1
## 946             Chorizo Ranchero Chimex 100Gr   17.0     17.00        1
## 947                 Coca Cola Retornable 2.5L   27.0     27.00        1
## 948                Coca Cola Retornable 500Ml   10.0     10.00        1
## 949                   Blanqueador Cloralex 1L   13.0     10.00        1
## 950   Papel Higienico Jumbo 455hojas Rollos 4   26.0     20.00        1
## 951                     Pan Molido Bimbo 210G   15.0     11.54        1
## 952                         Ruffles Queso 50G   13.0     13.00        1
## 953                        Cigarros Link 20pz   25.0     19.23        1
## 954          FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 955                       Gatorade Naranja 1L   25.0     25.00        1
## 956                      Frutsi Manzana 250Ml    5.0      5.00        1
## 957             Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 958                    Cheetos Torciditos 48g    8.0      8.00        1
## 959                        Cigarros Link 20pz   25.0     19.23        1
## 960              Clamato estilo cubano 473 ml   20.5     20.50        1
## 961             Tostadas El Gallo De Oro 250G   19.0     14.62        1
## 962                Coca Cola Retornable 500Ml   10.0     10.00        1
## 963            Cheetos Torciditos Nachos 48gr    8.0      8.00        2
## 964                      Gansito Marinela 50G   10.0      7.69        1
## 965  GATORADE FIERCE BLUE THUNDER MORAS BOT P   25.0     19.23        1
## 966                           Gatorade Uva 1L   25.0     25.00        1
## 967                     Bubulubu Ricolino 35G    8.0      6.15        1
## 968                           Pepsi N.R. 1.5L   18.0     18.00        1
## 969                Coca Cola Retornable 500Ml   10.0     10.00        1
## 970              Valle Frut Citrus Punch 1.5L   22.0     22.00        1
## 971                        Cigarros Link 20pz   25.0     19.23        1
## 972                          Pepsi N.R. 600Ml   13.0     13.00        1
## 973                      Coca Cola N. R. 2.5L   34.0     34.00        1
## 974                    Pinguinos Marinela 80G   15.0     11.54        1
## 975                            Pepsi N. R. 2L   22.0     22.00        1
## 976                     Crema Norteñita 250ml   20.0     15.38        1
## 977                Coca Cola Retornable 500Ml   10.0     10.00        1
## 978         Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 979                Coca Cola Retornable 500Ml   10.0     10.00        2
## 980                             Pepsi N.R. 3L   34.0     34.00        1
## 981        Mayonesa Hellmann´S Con Limon 190G   16.0     12.31        1
## 982                   Medias Noches Bimbo 8Pz   27.0     20.77        1
## 983                           Pepsi N.R. 1.5L   18.0     18.00        1
## 984                         Nutri Leche 1.89L   29.0     29.00        1
## 985                Coca Cola Retornable 500Ml   10.0     10.00        1
## 986                 Coca Cola Retornable 1.5L   18.0     18.00        1
## 987               Palomitas Poffets Queso 26G    8.0      6.15        1
## 988                          Pepsi N.R. 400Ml    8.0      8.00        1
## 989                             Pepsi N.R. 3L   34.0     34.00        1
## 990                        Cigarros Link 20pz   25.0     19.23        1
## 991            Leche Hersheys Chocolate 236Ml   11.5     11.50        1
## 992                          Pepsi N. R. 2.5L   27.0     27.00        1
## 993      Frutsi Sabor Ponche De Frutas 250 Ml    5.0      5.00        1
## 994          FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 995                           Pepsi N.R. 1.5L   18.0     18.00        1
## 996                                Epura 1.5L   13.0     13.00        1
## 997              Gatorade Ponche De Frutas 1L   25.0     25.00        1
## 998                Coca Cola Retornable 500Ml   10.0     10.00        1
## 999                         Negrito Bimbo 62G   10.0     10.00        1
## 1000                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 1001               Coca Cola Retornable 500Ml   10.0     10.00        2
## 1002                        Seven Up N. R. 2L   22.0     22.00        1
## 1003                    Powerade Frutas 600Ml   18.0     18.00        1
## 1004                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1005        FRIJOLES ENTEROS RANCH STYLE 425G   21.0     16.15        1
## 1006       CHIPOTLES ADOBADOS LA COSTEÑA 220G   21.5     16.54        1
## 1007                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 1008              Chicharrón De Cerdo Leo 30G   12.0      9.23        1
## 1009                   Zuko Sabor Durazno 15g    5.0      5.00        2
## 1010                Leche Negrito Bimbo 236Ml   10.0     10.00        1
## 1011       Mayonesa Hellmann´S Con Limon 190G   16.0     12.31        1
## 1012                          Frots Loops 90G   17.0     13.08        1
## 1013                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1014                  Frutsi Sabor Uva 250 Ml    5.0      5.00        1
## 1015     Frutsi Sabor Ponche De Frutas 250 Ml    5.0      5.00        1
## 1016                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1017            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1018                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1019                Bimbochitos vainilla 69 g   10.0     10.00        1
## 1020                       GERBER MANGOS 113G   12.0     12.00        1
## 1021                 Nectar Mango Jumex 450Ml   12.5     12.50        1
## 1022                           Joya Uva 600Ml   14.0     10.77        1
## 1023                Cerveza Tecate Light 16Oz   20.0     15.38        1
## 1024               Jumex Fresh Conga 2 Litros   21.0     21.00        1
## 1025                         Flash Lavanda 1L   16.0     12.31        1
## 1026                       Jarritos Piña 1.5L   16.0     16.00        1
## 1027                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 1028                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1029                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1030  CHIMEX SALCHICHA CON QUESO P/ASAR CARNE   68.0     68.00        1
## 1031           Pure De Tomate Del Fuerte 345G   10.5      8.08        2
## 1032           ARROZ SUPER EXTRA NOR-VER 500G   17.0     13.08        1
## 1033                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1034                    Saladitas Gamesa 137G   13.0     10.00        1
## 1035                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1036                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1037            Detergente Blanca Nieves 500G   19.5     15.00        1
## 1038                  H24 Casa Y Jardin 426Ml   53.0     40.77        1
## 1039           Yogh Beber Fresa Yopteens 330G   14.0     14.00        1
## 1040                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1041                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1042                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1043         VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        1
## 1044                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1045           Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 1046               Coca Cola Retornable 500Ml   10.0     10.00        3
## 1047                        Coca Cola N.R. 2L   28.0     28.00        1
## 1048                     Frutsi Manzana 250Ml    5.0      5.00        1
## 1049                   Pinguinos Marinela 80G   15.0     11.54        1
## 1050                  Sopa Maruchan Queso 64G   11.5      8.85        2
## 1051                   Queso Panela Lala 200G   40.0     40.00        1
## 1052                  Sopa Maruchan Queso 64G   11.5      8.85        4
## 1053               Blanqueador Cloralex 250Ml    5.0      3.85        1
## 1054                   Tang Sabor Naranja 15g    5.0      5.00        1
## 1055                    Powerade Frutas 600Ml   18.0     18.00        1
## 1056                   Tang Sabor Jamaica 15g    5.0      3.85        2
## 1057                    Crema Norteñita 250ml   20.0     15.38        1
## 1058                  Sopa Maruchan Queso 64G   11.5      8.85        3
## 1059                    Saladitas Gamesa 137G   13.0     10.00        1
## 1060                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1061                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1062               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 1063                Bimbochitos vainilla 69 g   10.0     10.00        1
## 1064                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1065            Mostaza Mccormick Frasco 210G   15.0     11.54        1
## 1066                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1067                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1068                    Saladitas Gamesa 137G   13.0     10.00        1
## 1069                            Pepsi N.R. 3L   34.0     34.00        1
## 1070                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1071         Strips Bokados Queso Y Chile 75G   10.0      7.69        1
## 1072              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 1073                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1074                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1075                  Joya Manzana N. R. 2.5L   30.0     30.00        1
## 1076                               Epura 1.5L   13.0     13.00        1
## 1077                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1078                            Clamato 473Ml   18.5     18.50        1
## 1079                    Saladitas Gamesa 137G   13.0     10.00        1
## 1080              Pulpy Mango del Valle 400ml   12.0     12.00        1
## 1081                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1082                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1083          Chicharron De Cerdo Bokados 70G   18.0     13.85        1
## 1084                       Seven Up N.R. 1.5L   18.0     18.00        1
## 1085                      Salsa San Luis 490G   14.0     10.77        1
## 1086                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 1087                     Powerade Moras 600Ml   18.0     13.85        1
## 1088                    Pulpy Del Valle 400Ml   12.0     12.00        1
## 1089                     Coca Cola N.R. 355Ml   11.0      8.46        1
## 1090                Cerveza Tecate Light 16Oz   20.0     15.38        4
## 1091                       Doritos Nachos 53G   12.0     12.00        1
## 1092            Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 1093                          Rancheritos 52g   11.0     11.00        1
## 1094                        Seven Up N. R. 2L   22.0     22.00        1
## 1095            Pure De Tomate Del Fuerte 1Kg   26.0     20.00        1
## 1096                  Blanqueador Cloralex 1L   13.0     10.00        1
## 1097                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1098                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1099                   Fanta Naranja N.R 2.5L   30.0     23.08        1
## 1100        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 1101                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1102                     Cacahuate Salado 45G    8.0      6.15        1
## 1103             Trident Yerbabuena 4´s 5.2gr    2.0      2.00        1
## 1104                     MASECA P/TAMAL 1KILO   16.0     12.31        1
## 1105                          Valle Frut 2.5L   33.0     33.00        1
## 1106                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1107                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 1108                            Clamato 296Ml   12.5     12.50        1
## 1109        Sopa De Letras Fior Di Pasta 200G    6.5      5.00        1
## 1110        GERBER VERD. CON RES Y ARROZ 113G   12.0     12.00        1
## 1111                 Aceite Vegetal 1-2-3 1Lt   37.0     28.46        1
## 1112                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 1113                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1114                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1115                 MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 1116                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1117                            Pepsi N.R. 3L   34.0     34.00        1
## 1118           Seven Up N.R. Lima-Limon 600Ml   13.0     13.00        1
## 1119      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 1120                    Powerade Frutas 600Ml   18.0     18.00        1
## 1121          Pake Taxo Sabritas Botanero 65G   11.0      8.46        1
## 1122             Bran Frut Barra De Fresa 40G    8.0      8.00        1
## 1123         Powerade Naranja-Mandarina 600Ml   18.0     18.00        1
## 1124              Palomitas Poffets Queso 26G    8.0      6.15        1
## 1125                       Doritos Nachos 53G   12.0     12.00        1
## 1126                    Powerade Frutas 600Ml   18.0     18.00        1
## 1127                       Paketaxo Queso 65G   11.0      8.46        2
## 1128                            Pepsi N.R. 3L   34.0     34.00        1
## 1129           Queso Tipo Sierra Norteño 170G   27.5     21.15        1
## 1130                               Epura 1.5L   13.0     13.00        1
## 1131                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1132                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1133                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1134                            Pepsi N.R. 3L   34.0     34.00        1
## 1135                            Clamato 946Ml   34.0     26.15        1
## 1136                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1137          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 1138              Naranjada Jumex Frutzo 1.5L   18.0     18.00        1
## 1139                MANTECA VEGETAL INCA 500G   28.0     21.54        1
## 1140               Garrafon Electropura 20 Lt   38.0     29.23        1
## 1141                    Crema Norteñita 250ml   20.0     15.38        1
## 1142                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 1143            Detergente Blanca Nieves 500G   19.5     15.00        1
## 1144                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1145                     Gansito Marinela 50G   10.0      7.69        1
## 1146             Clamato estilo cubano 473 ml   20.5     20.50        2
## 1147          Pedigree Cachorro de Res 100 gr   11.0      8.46        1
## 1148            VASOS DES CONVERMEX 12OZ 25PZ   14.0     10.77        1
## 1149                        Sprite N. R. 2.5L   30.0     30.00        1
## 1150                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1151             Topitos Jalapeño Bokados 65G   10.0      7.69        1
## 1152                     Sal De Uvas Picot 5G    3.5      3.50        1
## 1153                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1154             Clamato estilo cubano 473 ml   20.5     20.50        1
## 1155                 VASO CONVERMEX 16OZ 25PZ   20.0     15.38        1
## 1156              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1157               ATÉn El Dorado Aceite 140g   14.0     10.77        1
## 1158        Habaneras Integrales Gamesa 117Gr   11.0      8.46        1
## 1159 Queso Crema Philladelphia Barra 190G Kft   37.0     37.00        3
## 1160                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1161                            Pepsi N.R. 3L   34.0     34.00        1
## 1162         Tostadas El Gallo De Oro 90pzas.   49.0     37.69        1
## 1163                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1164                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1165                      Gel EGO black 250ml   18.5     18.50        1
## 1166 GATORADE FIERCE BLUE THUNDER MORAS BOT P   25.0     19.23        1
## 1167                       Cigarros Link 20pz   25.0     19.23        1
## 1168                            Clamato 473Ml   18.5     18.50        1
## 1169                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1170                 Manzanita Sol N.R. 400Ml    8.0      8.00        1
## 1171                Cerveza Tecate Light 16Oz   25.0     19.23        6
## 1172        Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 1173                        Ruffles Queso 50G   13.0     13.00        1
## 1174                       Doritos Nachos 53G   12.0     12.00        1
## 1175                Cerveza Tecate Light 16Oz   20.0     15.38        2
## 1176          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 1177                            Pepsi N.R. 3L   34.0     34.00        1
## 1178                       Paketaxo Queso 65G   11.0      8.46        2
## 1179                       Doritos Nachos 53G   12.0     12.00        1
## 1180           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 1181                        Powerade Moras 1L   22.0     16.92        1
## 1182               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1183                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1184                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1185                            Pepsi N.R. 3L   34.0     34.00        1
## 1186                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1187                Cerveza Tecate Light 16Oz   20.0     15.38        6
## 1188                  Charal Frito Bogo´S 40G   14.0     10.77        2
## 1189                 Mix Cantinero Bogos 100G   12.0      9.23        1
## 1190                  Camaron Seco Bogo´S 18G   14.0     10.77        1
## 1191                    Saladitas Gamesa 137G   13.0     10.00        1
## 1192                              Pinol 828Ml   19.0     14.62        1
## 1193                Bimbochitos vainilla 69 g   10.0     10.00        2
## 1194                  Blanqueador Cloralex 1L   13.0     10.00        1
## 1195                    Flash Brisa Marina 1L   16.0     12.31        1
## 1196                      Detergente Foca 1Kg   41.0     31.54        1
## 1197                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1198 Acondicionador De Telas Fresco Sol 850Ml   25.0     19.23        2
## 1199                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1200                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1201                         Pepsi N. R. 2.5L   27.0     27.00        2
## 1202                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1203                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1204         VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        1
## 1205                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1206                          Valle Frut 2.5L   33.0     33.00        1
## 1207                        Ruffles Queso 50G   13.0     13.00        1
## 1208                           Pepsi N. R. 2L   22.0     22.00        1
## 1209                Salsa En Polvo Tajin 150G   30.5     30.50        1
## 1210               Coca Cola Retornable 500Ml   10.0     10.00        2
## 1211 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 1212       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 1213                            Pepsi N.R. 3L   34.0     34.00        1
## 1214                  Lucas Panzon Sandia 38G    7.0      7.00        1
## 1215              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1216                  MEDIA CREMA NESTLE 225G   16.0     12.31        1
## 1217                    Saladitas Gamesa 137G   13.0     10.00        1
## 1218                   Tang Sabor Jamaica 15g    5.0      3.85        1
## 1219          Chicharron De Cerdo Bokados 70G   18.0     13.85        1
## 1220                     Sal De Uvas Picot 5G    3.5      3.50        1
## 1221                       Cigarros Link 20pz   25.0     19.23        1
## 1222                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 1223                        Ruffles Queso 50G   13.0     13.00        1
## 1224              Ensueño Bebe con Aloe 450ml   13.0     10.00        1
## 1225      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 1226                     Pepsi Light N.R 2.5L   27.0     20.77        1
## 1227                    Bocadin Ricolino 12gr    2.0      2.00        2
## 1228                Cerveza Tecate Light 16Oz   20.0     15.38        6
## 1229                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1230               Cacahuate Japones Leo 100G   12.0      9.23        1
## 1231 LALA YOMI UHT CHOCOLATE CARTON 250ML NAL   11.5     11.50        1
## 1232               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 1233                       Doritos Nachos 53G   12.0     12.00        1
## 1234               Be-Light Toronja Roja 1.5L   17.0     17.00        1
## 1235                           Pepsi N. R. 2L   22.0     22.00        1
## 1236                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1237                        Pepsi N. R. 500Ml   10.0     10.00        1
## 1238            Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 1239               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1240                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1241               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1242            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1243                      Sidral Mundet 500Ml   10.0      7.69        1
## 1244                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1245       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 1246    Papel Hig Color 360Hojas Dobles 4Pzas   22.0     16.92        1
## 1247        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 1248                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1249                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1250                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1251            Cacahuate Salado Encanto 100G   12.0      9.23        1
## 1252         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 1253                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1254                  Raid Acción Total 250Ml   47.0     36.15        1
## 1255                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1256            Pure De Tomate Del Fuerte 1Kg   26.0     20.00        1
## 1257                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1258 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 1259                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1260                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 1261                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1262                       KRAZY KOLA LOKA 2G   22.5     22.50        1
## 1263                 Veladora Limonera Nevada   14.5     11.15        2
## 1264                       Cigarros Link 20pz   25.0     19.23        1
## 1265                    Conchitas Encanto 60G   10.0      7.69        1
## 1266                     Cacahuate Salado 45G    8.0      6.15        1
## 1267                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 1268         Conchitas Granielote Encanto 55G   10.0      7.69        1
## 1269                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1270            Cacahuate Salado Encanto 100G   12.0      9.23        1
## 1271        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 1272                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 1273                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 1274                        Pepsi N. R. 500Ml   10.0     10.00        1
## 1275               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1276            Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 1277            Tostadas El Gallo De Oro 250G   19.0     14.62        1
## 1278               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1279                 Fanta Naranja N.R 600 Ml   14.0     10.77        1
## 1280                 Tostaditas Maizalgo 400g   28.0     21.54        1
## 1281                    Crema Norteñita 250ml   20.0     15.38        1
## 1282     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 1283                        Negrito Bimbo 62G   10.0     10.00        1
## 1284                    Leche Lala Premium 1L   22.0     16.92        1
## 1285            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1286 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 1287                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1288       Mayonesa Hellmann´S Con Limon 190G   16.0     12.31        1
## 1289              Pan Bimbo Blanco Chico 395G   25.0     19.23        1
## 1290  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 1291               Coca Cola Retornable 500Ml   10.0     10.00        4
## 1292    Gall Flor de Naranjo Gamesa 4pz 100gr   12.0      9.23        2
## 1293            PURE DE PAPA VERDE VALLE 160G   20.0     20.00        1
## 1294                    Crema Norteñita 250ml   20.0     15.38        1
## 1295                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1296                  Coca Cola Regular 355Ml    9.0      9.00        2
## 1297                            Pepsi N.R. 3L   34.0     34.00        1
## 1298                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1299        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 1300               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1301                               Epura 1.5L   13.0     13.00        1
## 1302                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 1303             Aceite Vegetal Cristal 500Ml   18.0     13.85        1
## 1304       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        4
## 1305 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 1306               Mirinda Naranja N.R. 600Ml   13.0     13.00        1
## 1307                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1308          Refresco De Toronja Fresca 2.5L   30.0     30.00        1
## 1309                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1310                            Pepsi N.R. 3L   34.0     34.00        1
## 1311                   Generosa Guayaba 413ml   12.0      9.23        1
## 1312                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 1313                     Salsa Valentina 370M   13.0     10.00        1
## 1314                     Gansito Marinela 50G   10.0      7.69        1
## 1315       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        2
## 1316                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1317                            Big Cola 1.5L   15.0     15.00        1
## 1318           MARINELA ROCKO MOBI BOLSA 45GR    5.0      3.85        1
## 1319                            Pepsi N.R. 3L   34.0     34.00        1
## 1320                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1321                 MANTECA VEGETAL INCA 1KG   40.5     31.15        1
## 1322                     Tang Sabor Fresa 15g    5.0      5.00        1
## 1323                 MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 1324                Papas Pringles Queso 40Gr   14.0     10.77        1
## 1325      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 1326              Springles Chile Y Limon 40G   14.0     10.77        1
## 1327    CHICHAROS Y ZANAHORIAS DEL MONTE 215G   10.0      7.69        1
## 1328                PERMA SHARP RASTRILLO 1PZ   10.5     10.50        1
## 1329                       Arroz Nor Ver 900g   26.0     20.00        1
## 1330     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 1331                        Ruffles Queso 50G   13.0     13.00        2
## 1332                              Bonafont 1L   11.0     11.00        1
## 1333        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 1334                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1335                       Cigarros Link 20pz   25.0     19.23        1
## 1336                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1337                    Powerade Frutas 600Ml   18.0     18.00        1
## 1338                         Mamut Gamesa 44G    6.0      4.62        1
## 1339                    Leche Lala Premium 1L   20.0     20.00        1
## 1340                    Saladitas Gamesa 137G   13.0     10.00        2
## 1341                 MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 1342                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1343       Sopa De Fideos Con Pollo Knorr 95G   13.0     10.00        1
## 1344            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 1345                         Pepsi N.R. 400Ml    8.0      8.00        1
## 1346                Gatorade Lima Limon 750Ml   20.0     20.00        1
## 1347         VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        2
## 1348                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        2
## 1349               Coca Cola Retornable 500Ml   10.0     10.00        2
## 1350                       Rocko Marinela 50G    5.0      3.85        1
## 1351            Madalenas con Mantequilla 93g   13.0     10.00        1
## 1352                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1353                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1354                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1355                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 1356            Fabuloso Fresca Lavanda 500Ml   17.0     13.08        1
## 1357       Detergente Salvo Microesferas 250G   12.0      9.23        1
## 1358                    Joya Manzana N.R 1.5L   22.0     22.00        1
## 1359                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1360                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1361                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1362                   Jugo Bida Mango 500 Ml   10.5     10.50        1
## 1363                     Jabon Zote Rosa 200G    9.5      7.31        1
## 1364                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1365                      Be-Light Jamaica 1L   13.0     13.00        1
## 1366                                 Epura 1L   10.0      7.69        1
## 1367                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1368                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 1369                 Fritos Chile Y Limón 47G    9.0      6.92        1
## 1370             Sabritas Papas Con Limon 40G   13.0     13.00        2
## 1371                         Pepsi Lata 355Ml   11.0     11.00        1
## 1372                       Cigarros Link 20pz   25.0     19.23        1
## 1373                            Clamato 473Ml   18.5     18.50        1
## 1374                        Ruffles Queso 50G   13.0     13.00        1
## 1375                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 1376               Coca Cola Retornable 500Ml   10.0     10.00        6
## 1377                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 1378                    Saladitas Gamesa 137G   13.0     10.00        1
## 1379                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1380                     Pepsi Light N.R 2.5L   27.0     20.77        1
## 1381                        Ruffles Queso 50G   13.0     13.00        2
## 1382                          Flash Floral 1L   16.0     12.31        1
## 1383                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1384  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 1385                Cremax De Nieve Fresa 90G   12.0      9.23        2
## 1386           Lavatrastes Limon Eficaz 750ml   27.0     20.77        1
## 1387                        Powerade Moras 1L   22.0     16.92        1
## 1388                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1389        Shampoo Mariposa Ropa Negra 480Ml   14.5     11.15        1
## 1390                     Ensueño Fresco 450Ml   13.0     10.00        1
## 1391                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1392       Detergente Líquido Más Color 415ml   18.0     13.85        1
## 1393       Detergente Salvo Microesferas 250G   12.0      9.23        1
## 1394                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1395                 Veladora Limonera Nevada   14.5     11.15        1
## 1396                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1397                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1398                Squirt Toronja 2.5 Litros   25.0     25.00        1
## 1399                       Paketaxo Queso 65G   11.0      8.46        2
## 1400             Papas Fritas Leo Con Sal 40G   11.0      8.46        1
## 1401                         Jarrito Piña 3Lt   28.0     21.54        1
## 1402                          Coca Lata 473Ml   15.0     15.00        1
## 1403                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1404       Bubba Xtreme Paleta Mora Azul 17gr    5.0      5.00        2
## 1405               Dulce suave Winis Uva 18 g    3.0      3.00        1
## 1406               Sopa Estrellitas Knorr 95G   13.0     10.00        2
## 1407                Bimbochitos vainilla 69 g   10.0     10.00        1
## 1408                  Chiquitin  Fresa 140 Gr    8.0      8.00        1
## 1409    Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 1410                  Aqua Frut Manzana 600Ml    9.5      9.50        1
## 1411                   Tang Sabor Naranja 15g    5.0      5.00        1
## 1412                       Cigarros Link 20pz   25.0     19.23        1
## 1413                        Pepsi N. R. 500Ml   10.0     10.00        1
## 1414                              Pinol 250Ml    9.0      6.92        1
## 1415                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1416 KINDER DELICE CACAO PASTELITO  T1 1PZA 3   10.5      8.08        1
## 1417                     Powerade Moras 600Ml   18.0     13.85        1
## 1418                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1419            Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 1420                        Ruffles Queso 50G   13.0     13.00        1
## 1421       Detergente Salvo Microesferas 250G   12.0      9.23        1
## 1422                      Nutri Leche 1 Litro   16.0     12.31        1
## 1423                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1424                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1425                Squirt Toronja 2.5 Litros   25.0     25.00        1
## 1426                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1427              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 1428         AZUCAR ESTANDAR 5 ESTRELLAS 900G   25.0     19.23        1
## 1429              Sabritas Papas Adobadas 45G   13.0     13.00        1
## 1430                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1431                          Leche Lala 1.8L   33.0     33.00        1
## 1432                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1433                  BEBIN SUPER GRANDE 14PZ   45.0     34.62        1
## 1434            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1435                     Halls Mora Azul 25gr    7.0      7.00        1
## 1436                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1437                            Clamato 296Ml   12.5     12.50        1
## 1438                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1439         VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        1
## 1440                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1441              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1442                        Sprite N. R. 2.5L   30.0     30.00        1
## 1443                        Ruffles Queso 50G   13.0     13.00        1
## 1444        Submarinos Vainilla Marinela 105G   12.0      9.23        1
## 1445            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1446                       Agua Mineral 355Ml    9.0      9.00        1
## 1447          Jugo De 8 Verduras Herdez 335Ml   11.0     11.00        1
## 1448                     Sal De Uvas Picot 5G    3.5      3.50        1
## 1449                     Powerade Moras 600Ml   18.0     13.85        1
## 1450                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1451                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1452                      Paketaxo Queso 215g   36.0     27.69        1
## 1453                                 Epura 1L   10.0      7.69        1
## 1454  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 1455                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 1456        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 1457                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 1458                    Conchitas Encanto 60G   10.0      7.69        1
## 1459  DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        1
## 1460        Sopa De Letras Fior Di Pasta 200G    6.5      5.00        1
## 1461                  Raid Acción Total 250Ml   47.0     36.15        1
## 1462      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 1463         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 1464                 Queso Aderezo Virmar 1Kg   28.5     21.92        1
## 1465                Sal Refinada La Fina 500G    7.5      5.77        1
## 1466                            Pepsi N.R. 3L   34.0     34.00        1
## 1467                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1468                         Fresca N.R. 1.5L   22.0     22.00        1
## 1469                      Nutri Leche 1 Litro   16.0     12.31        1
## 1470                     Powerade Moras 600Ml   18.0     13.85        1
## 1471                 Mayonesa La COSTEÑA 105G   12.5      9.62        1
## 1472                  Nutri Yoghurt Nuez 450g   12.5     12.50        1
## 1473               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1474                        Ruffles Queso 50G   13.0     13.00        1
## 1475                     Gansito Marinela 50G   10.0      7.69        1
## 1476               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 1477                       Cigarros Link 20pz   25.0     19.23        1
## 1478                        Pepsi N. R. 500Ml   10.0     10.00        1
## 1479 DANONE ACTIVIA P/BEBER PAPAYA Y CEREALES   11.5     11.50        2
## 1480       CHIPOTLES ADOBADOS LA COSTEÑA 220G   21.5     16.54        1
## 1481  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 1482                       GEL ATM POWER 250G   13.0     13.00        1
## 1483            KLEENBEBE ABSORSEC 14PZAS GDE   48.0     48.00        1
## 1484     LALA YOMI UHT FRESA CARTON 250ML NAL   11.5     11.50        3
## 1485 DANONE ACTIVIA P/BEBER PAPAYA Y CEREALES   11.5     11.50        1
## 1486          Salvo Detergente Líquido 300 ml   17.0     13.08        1
## 1487                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1488                   Cheetos Torciditos 48g    8.0      8.00        1
## 1489          Pedigree Cachorro de Res 100 gr   11.0      8.46        1
## 1490                 Pake Taxo Flaminhut 70gr   11.0      8.46        1
## 1491                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1492                     Gansito Marinela 50G   10.0      7.69        1
## 1493                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 1494                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1495                    Saladitas Gamesa 137G   13.0     10.00        1
## 1496                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1497     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 1498                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1499             Joya Sabores Retornable 2.5L   26.0     20.00        1
## 1500                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1501                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 1502                            Pepsi N.R. 3L   34.0     34.00        1
## 1503                       Cigarros Link 20pz   25.0     19.23        1
## 1504                   Pan Tostado Bimbo 210G   22.0     16.92        1
## 1505     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 1506                        Ruffles Queso 50G   13.0     13.00        1
## 1507                            Pepsi N.R. 3L   34.0     34.00        1
## 1508                     Frutsi Manzana 250Ml    5.0      5.00        1
## 1509                          Rancheritos 52g   11.0     11.00        1
## 1510                    Leche Lala Premium 1L   20.0     20.00        1
## 1511                Queso Oaxaca Camelia 200G   29.5     29.50        1
## 1512                    Garrafón Bonafont 19L   40.0     30.77        1
## 1513           Nectar Manzana Del Valle 250Ml    8.0      8.00        1
## 1514                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 1515              Danonino Fresa Bebible 90gr    5.0      5.00        2
## 1516                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 1517                  Pan Bimbo Integral 720G   37.0     28.46        1
## 1518                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1519                  Del Valle Durazno 250Ml    8.0      6.15        3
## 1520               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 1521         Sazonador Zona Carne Ihc 175 Gr.   30.0     23.08        1
## 1522                            Pepsi N.R. 3L   34.0     34.00        1
## 1523      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 1524                         Fresca N.R. 1.5L   22.0     22.00        1
## 1525                           Joya Uva 600Ml   14.0     10.77        1
## 1526                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1527                Cerveza Tecate Light 16Oz   25.0     19.23        1
## 1528                 Coca Cola Zero N.R. 2.5L   34.0     26.15        1
## 1529      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 1530                 VASO CONVERMEX 16OZ 25PZ   20.0     15.38        1
## 1531                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1532                     Cheese Puffs Leo 45G    6.0      4.62        1
## 1533                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 1534                    Conchitas Encanto 60G   10.0      7.69        1
## 1535        RAJAS DE Jalapeño LA COSTEÑA 105G    7.0      5.38        1
## 1536             Detergente Blanca Nieves 1Kg   38.5     29.62        1
## 1537          Jamón Americano De Pavo 170 Grs   29.0     29.00        1
## 1538                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1539         Conchitas Granielote Encanto 55G   10.0      7.69        2
## 1540        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 1541                  Blanqueador Cloralex 1L   13.0     10.00        1
## 1542                     Powerade Moras 600Ml   18.0     13.85        1
## 1543                  Starkis Extremo Leo 30G    5.0      3.85        1
## 1544                    Powerade Frutas 600Ml   18.0     18.00        1
## 1545                      Aqua Frut Uva 600Ml    9.5      9.50        1
## 1546                              Epura 600Ml    8.0      8.00        1
## 1547                       Cigarros Link 20pz   25.0     19.23        1
## 1548                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1549                    Joya Fresa N.R 600 Ml   14.0     14.00        1
## 1550                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 1551             Shampoo Savile Biotina 750Ml   39.0     30.00        1
## 1552                PERMA SHARP RASTRILLO 1PZ   10.5     10.50        1
## 1553                     Gansito Marinela 50G   10.0      7.69        1
## 1554                     Gansito Marinela 50G   10.0      7.69        1
## 1555 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 1556                  Frutsi Sabor Uva 250 Ml    5.0      5.00        1
## 1557                     Dalmata Marinela 55G    7.0      5.38        1
## 1558                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1559                       Cigarros Link 20pz   25.0     19.23        1
## 1560               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1561                        Ruffles Queso 50G   13.0     13.00        1
## 1562                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 1563                    Sopa Letras Knorr 95G   13.0     10.00        1
## 1564                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1565                     Pepsi Light N.R 2.5L   27.0     20.77        1
## 1566                   Salchicha de Pavo 266g   22.0     22.00        1
## 1567           Pure De Tomate Del Fuerte 345G   10.5      8.08        1
## 1568      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 1569                      Aqua Frut Uva 600Ml    9.5      9.50        1
## 1570                Squirt Toronja 2.5 Litros   25.0     25.00        1
## 1571                              Pinol 828Ml   19.0     14.62        1
## 1572              Chicharrón De Cerdo Leo 30G   12.0      9.23        1
## 1573                Coca Cola Retornable 2.5L   27.0     27.00        2
## 1574                           Tang Mango 15G    5.0      5.00        1
## 1575                  Del Valle Durazno 500Ml   13.0     13.00        1
## 1576                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1577                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1578       Gatorade De Ponche De Frutas 600Ml   21.0     21.00        1
## 1579    Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 1580                      Nutri Leche 1 Litro   16.0     12.31        1
## 1581             Clamato estilo cubano 473 ml   20.5     20.50        1
## 1582                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 1583                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1584                  Pan Bimbo Integral 720G   37.0     28.46        1
## 1585              Queso Americano Sc Lvi 175G   24.0     24.00        1
## 1586                   Totopos Bogo´S Ajo 60G   14.0     10.77        1
## 1587                      Cacahuate 3 Mix 80G   14.0     10.77        1
## 1588 KINDER DELICE CACAO PASTELITO  T1 1PZA 3   10.5      8.08        1
## 1589                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 1590                   Jabon Zote Blanco 100G    5.0      3.85        1
## 1591       Detergente Foca Biodegradable 250G   10.5      8.08        1
## 1592          Jamón Americano De Pavo 170 Grs   29.0     29.00        1
## 1593              Pan Bimbo Blanco Chico 395G   25.0     19.23        1
## 1594  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 1595                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1596                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1597                 Leche Lala Premium 500Ml   12.0     12.00        1
## 1598                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 1599                  Pan Bimbo Integral 405G   27.0     20.77        1
## 1600        Lala Sin Lactosa Descremada 21 lt   26.0     26.00        1
## 1601                        Panque Pasas 285G   30.0     23.08        1
## 1602        Mantecadas Vainilla 6 Pzas 187.5g   18.0     18.00        1
## 1603                    Leche Lala Premium 1L   20.0     20.00        1
## 1604                   Canelitas Marinela 90G   13.0     10.00        1
## 1605                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 1606                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1607                   Choco Milk Choc 160 gr   21.5     21.50        1
## 1608    Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 1609                              Epura 600Ml    8.0      8.00        1
## 1610               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1611                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1612                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 1613                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1614                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 1615                Multigrano Nuez Bimbo 34G    8.0      8.00        1
## 1616                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1617                    Joya Manzana R. 500Ml   10.0     10.00        1
## 1618                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1619                       Cigarros Link 20pz   25.0     19.23        1
## 1620      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 1621      Lechita Santa Clara Chocolate 200ml    9.5      9.50        1
## 1622 KINDER DELICE CACAO PASTELITO  T1 1PZA 3   10.5      8.08        1
## 1623                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1624                           Pepsi N. R. 2L   22.0     22.00        1
## 1625                Mirinda Naranja N.R. 2.5L   25.0     19.23        1
## 1626                Nescafé Clásico sobre 42g   25.0     25.00        1
## 1627     LALA YOMI UHT FRESA CARTON 250ML NAL   11.5     11.50        1
## 1628                       Seven Up N.R. 1.5L   18.0     18.00        1
## 1629                        Nutri Leche 1.89L   29.0     29.00        1
## 1630          Jugo De Durazno Del Valle 413Ml   12.0     12.00        1
## 1631                    Joya Manzana N.R 1.5L   22.0     22.00        1
## 1632          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 1633                   Tang Sabor Naranja 15g    5.0      5.00        2
## 1634                    Leche Lala Premium 1L   20.0     20.00        1
## 1635                 Halls Yerbabuena 25g 9pz    7.0      7.00        1
## 1636                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1637                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1638               Jabon Axion Liquido 280ml.   16.5     12.69        1
## 1639                       GEL EGO DIEZ 200ML   13.0     13.00        1
## 1640             Sabritas Papas Habanero 42 g   13.0     13.00        1
## 1641                       Cigarros Link 20pz   25.0     19.23        1
## 1642            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1643               Mirinda Naranja N.R. 600Ml   13.0     13.00        1
## 1644                            Pepsi N.R. 3L   34.0     34.00        1
## 1645                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 1646                  Nutri Yoghurt Nuez 450g   12.5     12.50        1
## 1647                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1648         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 1649          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 1650      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 1651                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 1652                  Coca Cola Regular 355Ml    9.0      9.00       15
## 1653                  Sprite Retornable 355Ml    9.0      9.00        2
## 1654                    Joya Sabores R. 355Ml    9.0      9.00        3
## 1655                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1656                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1657                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1658           MARLBORO ROJO 14S FLIP-TOP BOX   47.0     36.15        1
## 1659                  Del Valle Durazno 250Ml    8.0      6.15        1
## 1660                       Cigarros Link 20pz   25.0     19.23        1
## 1661                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1662                       Cigarros Link 20pz   25.0     19.23        1
## 1663                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 1664                  Del Valle Durazno 250Ml    8.0      6.15        1
## 1665                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 1666                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1667                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 1668           MARLBORO ROJO 14S FLIP-TOP BOX   47.0     36.15        1
## 1669              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1670                            Pepsi N.R. 3L   34.0     34.00        1
## 1671          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 1672                            Pepsi N.R. 3L   34.0     34.00        1
## 1673                       Cigarros Link 20pz   25.0     19.23        1
## 1674                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 1675                         Pepsi Lata 355Ml   11.0     11.00        1
## 1676                         Pepsi Lata 355Ml   11.0     11.00        1
## 1677            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1678          Pedigree Cachorro de Res 100 gr   11.0      8.46        1
## 1679                    Saladitas Gamesa 137G   13.0     10.00        1
## 1680                            Pepsi N.R. 3L   34.0     34.00        1
## 1681                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1682              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 1683                 Fanta Naranja N.R 600 Ml   14.0     10.77        1
## 1684                    Powerade Frutas 600Ml   18.0     18.00        1
## 1685                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1686                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 1687              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1688                    Zuko Sabor Fresa 15gr    5.0      5.00        2
## 1689                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1690        VELADORA VIRGEN DE GUADALUPE 400G   31.5     24.23        1
## 1691                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1692                    Del Valle Mango 250Ml    8.0      8.00        1
## 1693                 Veladora Limonera Nevada   14.5     11.15        1
## 1694                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 1695          Danonino Maxi Fresa Danone 170G    8.0      8.00        1
## 1696                          Gatorade Uva 1L   25.0     25.00        1
## 1697                         Pepsi N.R. 400Ml    8.0      8.00        1
## 1698                                 Epura 1L   10.0      7.69        1
## 1699                    Bubulubu Ricolino 35G    8.0      6.15        1
## 1700                           Pepsi N. R. 2L   22.0     22.00        1
## 1701                        Ruffles Queso 50G   13.0     13.00        1
## 1702                      Nutri Leche 1 Litro   16.0     12.31        1
## 1703                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1704                          Leche Lala 1.8L   33.0     33.00        1
## 1705                     Sal De Uvas Picot 5G    3.5      3.50        4
## 1706                    Joya Fresa N.R 600 Ml   14.0     14.00        1
## 1707                        Ruffles Queso 50G   13.0     13.00        1
## 1708              Sabritones Chile Limón 60gr   10.0      7.69        1
## 1709             Sabritas Papas Con Limon 40G   13.0     13.00        1
## 1710                 Downy Brisa Fresca 800ml   27.5     21.15        1
## 1711                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1712         FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 1713               Blanqueador Cloralex 250Ml    5.0      3.85        1
## 1714        GERBER VERD. CON RES Y ARROZ 113G   12.0     12.00        1
## 1715                         Ace Actiblu 250G   10.5      8.08        1
## 1716                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1717                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1718                      Sidral Mundet 500Ml   10.0      7.69        1
## 1719                            Pepsi N.R. 3L   34.0     34.00        1
## 1720                                 Epura 1L   10.0      7.69        1
## 1721                Mirinda Naranja N.R. 1.5L   18.0     18.00        1
## 1722          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 1723                                 Epura 1L   10.0      7.69        1
## 1724             Mantequilla Lala Sin Sal 90G   15.5     11.92        1
## 1725             Mantequilla Lala Sin Sal 90G   15.5     11.92        1
## 1726                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 1727              HARINA DE TRIGO SELECTA 1KG   15.0     11.54        1
## 1728                           Joya Uva 600Ml   14.0     10.77        1
## 1729                    Leche Lala Premium 1L   20.0     20.00        1
## 1730                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1731                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1732                      Rellerindo Vero 1Pz    1.0      1.00        1
## 1733              M&M Chocolate Display 47.9G   15.0     11.54        2
## 1734       Detergente Líquido Más Color 415ml   18.0     13.85        1
## 1735                        Ruffles Queso 50G   13.0     13.00        1
## 1736              Semilla Girasol Bokados 40G    8.0      6.15        1
## 1737                            Pepsi N.R. 3L   34.0     34.00        1
## 1738      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 1739                      Frutimax Naranja 7G    3.5      3.50        1
## 1740                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1741                  Coca Cola Regular 355Ml    9.0      9.00        1
## 1742                    Fanta Retornable 1.5L   18.0     18.00        1
## 1743      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 1744                    Saladitas Gamesa 137G   13.0     10.00        1
## 1745                  MAZATUN EN ACEITE 140GR   16.5     12.69        1
## 1746                   Lucas Muecas Mango 24G    7.0      7.00        1
## 1747                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 1748                     Mole Doña Maria 235G   36.5     28.08        1
## 1749            Detergente Blanca Nieves 250G   10.5      8.08        1
## 1750              Suavitel Aroma De Sol 450Ml   15.0     11.54        1
## 1751                   Churrumais Flamas 60g.    7.0      5.38        1
## 1752                         Mamut Gamesa 44G    6.0      4.62        1
## 1753                         Pepsi N.R. 400Ml    8.0      8.00        1
## 1754                            Pepsi N.R. 3L   34.0     34.00        1
## 1755         FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 1756              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1757                              Pinol 500Ml   15.0     11.54        1
## 1758       Detergente Salvo Microesferas 500G   24.0     18.46        1
## 1759                 SERVILLETAS VELVET 125PZ   10.0      7.69        1
## 1760              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1761                            Clamato 473Ml   18.5     18.50        1
## 1762                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 1763            Detergente Blanca Nieves 250G   10.5      8.08        1
## 1764        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 1765         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 1766                 Chokis Choko Gamesa 84gr   12.0      9.23        1
## 1767                       Doritos Nachos 53G   12.0     12.00        2
## 1768                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1769                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1770                            Pepsi N.R. 3L   34.0     34.00        1
## 1771                         Choco Lala 500Ml   17.0     17.00        1
## 1772                     Sal De Uvas Picot 5G    3.5      3.50        1
## 1773                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1774      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 1775                        Sprite N.R. 600Ml   14.0     14.00        1
## 1776                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1777        FRIJOLES ENTEROS RANCH STYLE 425G   21.0     16.15        1
## 1778                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1779                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1780      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        2
## 1781                   Jabon Zote Blanco 200G    9.5      7.31        1
## 1782                       Cigarros Link 20pz   25.0     19.23        1
## 1783                      Sidral Mundet 500Ml   10.0      7.69        1
## 1784                    Joya Manzana R. 500Ml   10.0     10.00        1
## 1785           Frikos Con Chilito Bokados 75G   10.0      7.69        1
## 1786            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1787             Semilla Calabaza Bokados 25G   11.0      8.46        1
## 1788              Bran Frut Barra De Piña 40G    8.0      8.00        1
## 1789                    Saladitas Gamesa 137G   13.0     10.00        1
## 1790                  Nectar Manz Jumex 250Ml    8.0      8.00        1
## 1791                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1792                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 1793                         Mamut Gamesa 44G    6.0      4.62        2
## 1794                 Manzanita Sol N.R. 400Ml    8.0      8.00        1
## 1795                        Negrito Bimbo 62G   10.0     10.00        1
## 1796                         Mamut Gamesa 44G    6.0      4.62        1
## 1797         Chicharron De Cerdo Sabritas 30G   12.0      9.23        1
## 1798                 Mirinda Naranja N. R. 2L   22.0     22.00        1
## 1799                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 1800                            Pepsi N.R. 3L   34.0     34.00        1
## 1801            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1802                    Leche Lala Premium 1L   20.0     20.00        1
## 1803          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 1804                 Queso Aderezo Virmar 1Kg   28.5     21.92        1
## 1805              Sabritones Chile Limón 60gr   10.0      7.69        1
## 1806                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 1807          Pedigree Cachorro de Res 100 gr   11.0      8.46        2
## 1808               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1809  Papel Higienico Jumbo 455hojas Rollos 4   26.0     20.00        1
## 1810                    Joya Manzana R. 500Ml   10.0     10.00        1
## 1811           Sabrita Jalapeño Crujiente 46g   13.0     13.00        1
## 1812                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1813                   Churrumais Flamas 60g.    7.0      5.38        1
## 1814                            Clamato 946Ml   34.0     26.15        1
## 1815                       Panque Marmol 300G   30.0     30.00        1
## 1816                    Leche Lala Premium 1L   20.0     20.00        1
## 1817               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1818                       Cigarros Link 20pz   25.0     19.23        1
## 1819                    Joya Manzana N.R 1.5L   22.0     22.00        1
## 1820                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 1821                      ARIEL EN POLVO 850G   33.0     25.38        1
## 1822                   Pinguinos Marinela 80G   15.0     11.54        1
## 1823               Downy Libre Enjuague 850Ml   27.5     21.15        1
## 1824                        Pepsi N. R. 500Ml   10.0     10.00        1
## 1825                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 1826                 Choco Roles Marinela 67G   15.0     11.54        1
## 1827                 Mayonesa La COSTEÑA 105G   12.5      9.62        1
## 1828                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1829                        Pepsi N. R. 500Ml   10.0     10.00        1
## 1830              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1831                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1832              PAPEL HIGIENICO PREMIER 4PZ   28.0     21.54        1
## 1833              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1834                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 1835                      Jugo Bida Uva 500Ml   10.5     10.50        1
## 1836            Jumex Nectar De Durazno 440Ml   12.5     12.50        1
## 1837                     Gansito Marinela 50G   10.0      7.69        1
## 1838        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 1839            Massiso Chich Harina Leo 175G   27.0     20.77        1
## 1840 ACT II PALOMITAS P/MICROONDAS SABOR MANT   12.0      9.23        1
## 1841                                 Epura 1L   10.0      7.69        1
## 1842 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 1843            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 1844                           Pepsi N. R. 2L   22.0     22.00        1
## 1845                     Coca Cola N.R. 600Ml   14.0     14.00        2
## 1846                    Joya Fresa N.R 600 Ml   14.0     14.00        2
## 1847                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 1848            Frijoles Bayos La Sierra 430g   16.0     12.31        1
## 1849                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 1850                     Coca Cola Zero 600Ml   14.0     14.00        1
## 1851             LECHE NIDO KINDER BOLSA 114G   26.0     26.00        1
## 1852          Jugo De Durazno Del Valle 413Ml   12.0     12.00        1
## 1853                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 1854              Sopa Maruchan Carne Res 64G   12.0      9.23        1
## 1855                        Ruffles Queso 50G   13.0     13.00        1
## 1856       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 1857                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1858          Panquecitos C/Gota De Chocolate   15.0     11.54        1
## 1859                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1860               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1861             Sabritas Papas Habanero 42 g   13.0     13.00        1
## 1862                        Powerade Moras 1L   22.0     16.92        1
## 1863                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 1864            Jarritos Sabor Mandarina 1.5L   16.0     16.00        1
## 1865     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 1866                        Ruffles Queso 50G   13.0     13.00        1
## 1867                Coca Cola Retornable 1.5L   18.0     18.00        1
## 1868                  Charal Frito Bogo´S 40G   14.0     10.77        1
## 1869                     Coca Cola N.R. 500Ml   13.0     13.00        2
## 1870                      Nutri Leche 1 Litro   16.0     12.31        1
## 1871                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1872                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1873                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1874                Sal Refinada La Fina 500G    7.5      5.77        1
## 1875                     Gansito Marinela 50G   10.0      7.69        1
## 1876       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        2
## 1877                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 1878                            Pepsi N.R. 3L   34.0     34.00        1
## 1879 MARINELA MINI BARRITAS FRESA MAXITUBO 20   22.0     16.92        1
## 1880                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 1881            Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 1882                MANTECA VEGETAL INCA 500G   28.0     21.54        1
## 1883                        Ruffles Queso 50G   13.0     13.00        1
## 1884                     Coca Cola Zero 600Ml   14.0     14.00        1
## 1885                   Manzanita Sol N. R. 2L   18.0     13.85        1
## 1886                      Frutimax Naranja 7G    3.5      3.50        1
## 1887                   Frutimax De Jamaica 7g    3.5      3.50        1
## 1888                     Maseca Antojitos 1kg   16.0     12.31        1
## 1889               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 1890                  Lucas Muecas Chamoy 24G    7.0      7.00        1
## 1891                         Fresca N.R. 1.5L   22.0     22.00        1
## 1892               Coca Cola Retornable 500Ml   10.0     10.00        1
## 1893                      ARIEL EN POLVO 850G   33.0     25.38        1
## 1894                         Pepsi N.R. 600Ml   13.0     13.00        1
## 1895           Nectar Manzana Del Valle 250Ml    8.0      8.00        1
## 1896                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 1897       Mayonesa Hellmann´S Con Limon 190G   16.0     12.31        1
## 1898                           Tang Mango 15G    5.0      5.00        1
## 1899 Papas Fritas Onduladas Leo Con Queso 40G   11.0      8.46        1
## 1900                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1901               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 1902            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1903                     Coca Cola N.R. 600Ml   14.0     14.00        2
## 1904                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1905              Bubulubu Frost Ricolino 35g    7.0      5.38        1
## 1906                         Pepsi N. R. 2.5L   27.0     27.00        1
## 1907                         HotKis Bimbo 50g    5.0      3.85        2
## 1908                    Leche Lala Premium 1L   20.0     20.00        1
## 1909                Sal Refinada La Fina 500G    7.5      5.77        1
## 1910                   Powerade Lima-Limon 1L   22.0     22.00        1
## 1911              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 1912                 Manzanita Sol N.R. 400Ml    8.0      8.00        1
## 1913        Bubba Xtreme Paleta Pica Mix 20gr    5.0      5.00        1
## 1914                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 1915                Papas Pringles Queso 40Gr   14.0     10.77        1
## 1916                Leche Negrito Bimbo 236Ml   10.0     10.00        1
## 1917                        Ruffles Queso 50G   13.0     13.00        1
## 1918       Mantecadas Nuez Bimbo 6 Pzas 84.5g   18.0     18.00        1
## 1919                   Manzanita Sol N. R. 2L   18.0     13.85        1
## 1920                            Pepsi N.R. 3L   34.0     34.00        1
## 1921                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1922                         Choco Lala 500Ml   17.0     17.00        1
## 1923              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1924                        Tang Horchata 15G    5.0      5.00        1
## 1925                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 1926              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1927    Chicharron Chile Y Limon Bokados 120G   17.0     13.08        1
## 1928                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 1929                   Tang Sabor Naranja 15g    5.0      5.00        1
## 1930              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1931                      Tang Sabor Piña 15g    5.0      5.00        1
## 1932                 Chokis Choko Gamesa 84gr   12.0      9.23        1
## 1933                       Barritas Fresa 64G   10.0      7.69        2
## 1934                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 1935                  Del Valle Durazno 250Ml    8.0      6.15        1
## 1936                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1937                  Frutsi Sabor Uva 250 Ml    5.0      5.00        2
## 1938                   Jabon Zote Blanco 100G    5.0      3.85        1
## 1939        Mantecadas Vainilla 6 Pzas 187.5g   18.0     18.00        1
## 1940                       Panque Marmol 300G   30.0     30.00        1
## 1941       Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 1942                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 1943                            Pepsi N.R. 3L   34.0     34.00        1
## 1944          Prispas A La Francesa Boka2 50G   10.0      7.69        1
## 1945                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 1946                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 1947            Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 1948             Sabritas Papas Con Limon 40G   13.0     13.00        1
## 1949                         Pepsi N.R. 400Ml    8.0      8.00        1
## 1950                    Halls Cereza 25gr 9pz    6.0      4.62        2
## 1951                           Flan Lala 100G    7.5      7.50        2
## 1952                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 1953                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 1954                    Squirt Toronja 1.5 Lt   18.0     18.00        3
## 1955      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 1956                           Pepsi N. R. 2L   22.0     22.00        1
## 1957        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 1958                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 1959                Marlboro 14´s Light 100´s   47.0     36.15        1
## 1960                                Ciel 1.5L   13.0     10.00        2
## 1961                Coca Cola Retornable 2.5L   27.0     27.00        1
## 1962                    Cacahuate Japones 55G    8.0      6.15        1
## 1963             Cacahuate Salado Bokados 90G   12.0      9.23        1
## 1964                       Doritos Nachos 53G   12.0     12.00        1
## 1965                 Hot-Nuts Multintenso 50G   10.0      7.69        1
## 1966                          Rancheritos 52g   11.0     11.00        1
## 1967              Fritura De Maiz Bogo´S 125G   14.0     10.77        1
## 1968                        Ruffles Queso 50G   13.0     13.00        1
## 1969                            Pepsi N.R. 3L   34.0     34.00        1
## 1970                Gatorade Lima Limon 750Ml   20.0     20.00        1
## 1971                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 1972                Leche Negrito Bimbo 236Ml   10.0     10.00        2
## 1973                  Gelatina Dany Piña 125G    6.5      6.50        1
## 1974               Dulce suave Winis Uva 18 g    3.0      3.00        1
## 1975            Flan Danette Vainilla 100Grs.    7.5      7.50        1
## 1976                          Pepsi N.R. 1.5L   18.0     18.00        1
## 1977               Arcoiris Fresa Gamesa 75gr   12.0      9.23        1
## 1978                  Pan Bimbo Integral 720G   37.0     28.46        1
## 1979                    Leche Lala Premium 1L   20.0     20.00        1
## 1980                         Sprite N.R. 1.5L   22.0     16.92        1
## 1981                       Mazapán Azteca 30G    3.0      2.31        2
## 1982                         Choco Lala 500Ml   17.0     17.00        1
## 1983       DANUP STRAWBERRY P/BEBER 350GR NAL   14.0     14.00        1
## 1984       Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 1985       Gatorade De Ponche De Frutas 600Ml   21.0     21.00        1
## 1986              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 1987            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 1988      Lechita Santa Clara Chocolate 200ml    9.5      9.50        1
## 1989            Flan Danette Vainilla 100Grs.    7.5      7.50        2
## 1990  DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        1
## 1991                                 Epura 1L   10.0      7.69        1
## 1992                         Fresca N.R. 1.5L   22.0     22.00        1
## 1993                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 1994   Veladora Limonero Supremo C/Aroma 1 Pz   14.5     11.15        1
## 1995                 Leche Lala Premium 500Ml   12.0     12.00        1
## 1996                Kinder Maxi Chocolate 21G    8.0      6.15        2
## 1997               Pastilla Flash Lavanda 72G   15.0     11.54        1
## 1998              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 1999                       Barritas Fresa 64G   10.0      7.69        1
## 2000                     Powerade Moras 600Ml   18.0     13.85        1
## 2001  LALA YOMI UHT VAINILLA CARTON 250ML NAL   11.5     11.50        1
## 2002                            Clamato 296Ml   12.5     12.50        1
## 2003                       Cigarros Link 20pz   25.0     19.23        1
## 2004                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2005                 Kinder Sorpresa TMNT 20g   20.0     15.38        2
## 2006                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 2007                    Leche Lala Premium 1L   20.0     20.00        1
## 2008         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 2009         Strips Bokados Queso Y Chile 75G   10.0      7.69        1
## 2010               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2011                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2012                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 2013                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2014           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 2015       Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 2016         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 2017                  Joya Manzana N. R. 2.5L   30.0     30.00        1
## 2018                   Joya Durazno N.R. 1.5L   22.0     16.92        1
## 2019               Downy Libre Enjuague 850Ml   27.5     21.15        1
## 2020                              Pinol 828Ml   19.0     14.62        1
## 2021            Detergente Ariel Oxiazul 500G   24.0     18.46        1
## 2022         AZUCAR ESTANDAR 5 ESTRELLAS 900G   25.0     19.23        1
## 2023                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2024               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2025                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2026               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2027                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2028        Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 2029                        Nutri Leche 1.89L   29.0     29.00        1
## 2030                       Paketaxo Queso 65G   11.0      8.46        1
## 2031          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 2032                    Leche Lala Premium 1L   20.0     20.00        1
## 2033                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2034                       Marias Doradas 85g   12.0      9.23        1
## 2035               Arcoiris Fresa Gamesa 75gr   12.0      9.23        1
## 2036                 Leche Lala Premium 500Ml   12.0     12.00        1
## 2037                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 2038           Fabuloso Fresco Amanecer 500Ml   17.0     13.08        1
## 2039 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        2
## 2040              Palomitas Poffets Queso 26G    8.0      6.15        1
## 2041              Yoghurt Cereal Colores 100G    9.5      9.50        1
## 2042                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 2043                  Coca Cola Regular 355Ml    9.0      9.00        4
## 2044                Cerveza Tecate Light 16Oz   20.0     15.38        5
## 2045                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 2046                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2047            Canada Dry Agua Mineral 600Ml   13.0     13.00        1
## 2048                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2049                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2050          Jugo De 8 Verduras Herdez 335Ml   11.0     11.00        1
## 2051    Papel Hig Color 360Hojas Dobles 4Pzas   22.0     16.92        1
## 2052                                 Epura 1L   10.0      7.69        1
## 2053              ABSORSEC TOALLA HUMEDA 70PZ   21.5     21.50        1
## 2054                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2055                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2056       Gatorade De Ponche De Frutas 600Ml   21.0     21.00        1
## 2057     LALA YOMI UHT FRESA CARTON 250ML NAL   11.5     11.50        1
## 2058  LALA YOMI UHT VAINILLA CARTON 250ML NAL   11.5     11.50        1
## 2059                    Leche Lala Premium 1L   20.0     20.00        1
## 2060                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2061                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 2062                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2063                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2064                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2065                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 2066         GILLETTE CLEAR GEL COOL WAVE 82G   65.0     65.00        1
## 2067                 Trikitrakes Marinela 69G   10.0      7.69        1
## 2068          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 2069                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 2070                   Frutimax De Jamaica 7g    3.5      3.50        1
## 2071                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2072                      La Lechera Pack 90g    9.0      6.92        1
## 2073                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 2074                       Cigarros Link 20pz   25.0     19.23        1
## 2075                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2076               Coca Cola Retornable 500Ml   10.0     10.00        2
## 2077                      Zucaritas Sobre 30G    8.0      6.15        1
## 2078                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2079     LALA YOMI UHT FRESA CARTON 250ML NAL   11.5     11.50        1
## 2080                              Pinol 500Ml   15.0     11.54        1
## 2081                  Flash Xtra Floral 500Ml    9.5      7.31        1
## 2082                   Negrito Duo Bimbo 124g   15.0     15.00        2
## 2083                            Pepsi N.R. 3L   34.0     34.00        1
## 2084                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2085                Marlboro 14´s Light 100´s   47.0     36.15        1
## 2086                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2087                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2088                   Tang Sabor Jamaica 15g    5.0      3.85        1
## 2089                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2090                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2091                       Agua Mineral 355Ml    9.0      9.00        1
## 2092                         Pepsi N.R. 600Ml   13.0     13.00        1
## 2093                               Epura 1.5L   13.0     13.00        1
## 2094                      Nutri Leche 1 Litro   16.0     12.31        2
## 2095                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 2096                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2097                       Cigarros Link 20pz   25.0     19.23        1
## 2098                        Nutri Leche 1.89L   29.0     29.00        1
## 2099                    Epura Purificada 2Lts   14.0     10.77        1
## 2100                           Pepsi N. R. 2L   22.0     22.00        1
## 2101          Danonino Maxi Fresa Danone 170G    8.0      8.00        1
## 2102            Detergente Blanca Nieves 250G   10.5      8.08        1
## 2103                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 2104        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 2105                        Powerade Frutas1L   22.0     22.00        1
## 2106                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 2107          TOALLA BUENAS NOCHES S/ALAS 10P   36.0     27.69        1
## 2108                            Pepsi N.R. 3L   34.0     34.00        1
## 2109               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2110                        Seven Up N. R. 2L   22.0     22.00        1
## 2111                      Nutri Leche 1 Litro   16.0     12.31        1
## 2112                Giro Chocolate Gamesa 95g   12.0      9.23        1
## 2113                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2114           Clamato Vuelve A La Vida 473Ml   20.5     20.50        1
## 2115                  Joya Manzana N. R. 2.5L   30.0     30.00        1
## 2116                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 2117                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2118                Cerillos Flama 115 Piezas    5.5      5.50        1
## 2119               Blanqueador Cloralex 500Ml    8.0      6.15        1
## 2120            Flash Xtra Brisa Marina 500Ml    9.5      7.31        1
## 2121          Ensueño Rocio de Violetas 450ml   13.0     10.00        1
## 2122       Detergente Foca Biodegradable 500G   21.0     16.15        1
## 2123                   Frutimax De Jamaica 7g    3.5      3.50        1
## 2124          Jugo De Durazno Del Valle 413Ml   12.0     12.00        1
## 2125                   Frutimax De Jamaica 7g    3.5      3.50        1
## 2126                    Powerade Frutas 600Ml   18.0     18.00        1
## 2127  LALA YOMI UHT VAINILLA CARTON 250ML NAL   11.5     11.50        1
## 2128       Detergente Salvo Microesferas 250G   12.0      9.23        1
## 2129        Knorr Sazonador Mi Arroz Rojo 17g    6.5      5.00        1
## 2130                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2131                 Fritos Chile Y Limón 47G    9.0      6.92        1
## 2132              Sabritones Chile Limón 60gr   10.0      7.69        1
## 2133                    Leche Lala Premium 1L   20.0     20.00        1
## 2134             Crema Acidificada Lala 200Ml   15.5     15.50        1
## 2135                 Manzanita Sol N.R. 400Ml    8.0      8.00        1
## 2136                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2137                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2138              Cheetos Jumbo Colmillos 27g    8.0      6.15        1
## 2139                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2140                    Joya Manzana R. 500Ml   10.0     10.00        1
## 2141   FRIJOLES BAYOS REFRITOS LA SIERRA 430G   14.5     11.15        1
## 2142                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2143                            Pepsi N.R. 3L   34.0     34.00        1
## 2144                    Joya Manzana R. 500Ml   10.0     10.00        1
## 2145                Kinder Maxi Chocolate 21G    8.0      6.15        2
## 2146          Principe Marinela Chocolate 85G   13.0     10.00        1
## 2147           Leche Hersheys Chocolate 236Ml   11.5     11.50        2
## 2148      Lechita Santa Clara Chocolate 200ml    9.5      9.50        2
## 2149                           Pepsi N. R. 2L   22.0     22.00        1
## 2150                    Fanta Retornable 1.5L   18.0     18.00        1
## 2151          Principe Marinela Chocolate 85G   13.0     10.00        1
## 2152                  Yoghurt Fresa Lala 440G   16.5     16.50        1
## 2153                     Tang Sabor Fresa 15g    5.0      5.00        2
## 2154          Ensueño Rocio de Violetas 450ml   13.0     10.00        1
## 2155       Detergente Foca Biodegradable 250G   10.5      8.08        1
## 2156              Vinagre Blanco El Ciervo 1L   16.0     12.31        1
## 2157                   Cheetos Torciditos 48g    8.0      8.00        1
## 2158                        Ruffles Queso 50G   13.0     13.00        2
## 2159                         Panque Nuez 270G   30.0     30.00        1
## 2160                          Bimbuñuelos 99g   14.0     10.77        1
## 2161                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2162      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 2163           Pure De Tomate Del Fuerte 345G   10.5      8.08        1
## 2164                       Cigarros Link 20pz   25.0     19.23       10
## 2165                 Leche Lala Premium 500Ml   12.0     12.00        1
## 2166                Cerveza Tecate Light 16Oz   20.0     15.38        2
## 2167            Detergente Blanca Nieves 250G   10.5      8.08        1
## 2168            Yoghurt Cereal Chocolate 100G    9.5      9.50        1
## 2169                 Manzanita Sol N.R. 600Ml   13.0     13.00        1
## 2170              Suavitel Aroma De Sol 450Ml   15.0     11.54        1
## 2171                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2172               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2173                   Pinguinos Marinela 80G   15.0     11.54        1
## 2174        Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 2175            Detergente Blanca Nieves 250G   10.5      8.08        1
## 2176                MANTECA VEGETAL INCA 500G   28.0     21.54        1
## 2177                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2178                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2179                         Volt Lata 473 ml   17.0     13.08        1
## 2180                 Leche Lala Premium 500Ml   12.0     12.00        1
## 2181 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 2182                      Detergente Ace 500G   21.0     16.15        1
## 2183            Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 2184                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 2185      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 2186              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 2187                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2188                            Sangria 355Ml    9.0      9.00        1
## 2189                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2190                   Kinder Chocolate 12.5g    4.5      3.46        1
## 2191                   Jabon Zote Blanco 200G    9.5      7.31        1
## 2192                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2193                        Nutri Leche 1.89L   29.0     29.00        1
## 2194           Nectar Manzana Del Valle 250Ml    8.0      8.00        1
## 2195            POLVO PARA HORNEAR REXAL 100G   12.0      9.23        1
## 2196  NESCAFE DECAF 100% ARABICA CAFE SOLUBLE   28.0     28.00        1
## 2197                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 2198                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 2199                    Leche Lala Premium 1L   20.0     20.00        1
## 2200      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 2201                           Pepsi N. R. 2L   22.0     22.00        1
## 2202        PRESTOBARBA3 MAQUINA GILLETTE 1PZ   22.0     22.00        1
## 2203                 Veladora Limonera Nevada   14.5     11.15        2
## 2204                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2205                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2206                       Doritos Nachos 53G   12.0     12.00        1
## 2207                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 2208                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2209                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2210                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2211               Blanqueador Cloralex 500Ml    8.0      6.15        1
## 2212               Queso Americano Nutrileche   14.5     14.50        2
## 2213                              Pinol 500Ml   15.0     11.54        1
## 2214                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2215                         Pepsi N.R. 600Ml   13.0     13.00        1
## 2216                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2217            VASOS DES CONVERMEX 12OZ 25PZ   14.0     10.77        1
## 2218                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2219                  Joya Manzana N. R. 2.5L   30.0     30.00        1
## 2220                 Coca Cola Zero N.R. 2.5L   34.0     26.15        1
## 2221                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 2222 GATORADE FIERCE BLUE THUNDER MORAS BOT P   25.0     19.23        1
## 2223                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2224                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2225                     Coca Cola Zero 600Ml   14.0     14.00        1
## 2226                 Choco Roles Marinela 67G   15.0     11.54        1
## 2227                              Epura 600Ml    8.0      8.00        1
## 2228  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 2229                        Ruffles Queso 50G   13.0     13.00        1
## 2230                       Doritos Nachos 53G   12.0     12.00        2
## 2231              Cheetos Jumbo Colmillos 27g    8.0      6.15        1
## 2232             Knorr Sopa De Municiones 95G   13.0     10.00        2
## 2233                          Rancheritos 52g   11.0     11.00        1
## 2234                            Pepsi N.R. 3L   34.0     34.00        1
## 2235        FRIJOLES ENTEROS RANCH STYLE 425G   21.0     16.15        1
## 2236                       Agua Mineral 355Ml    9.0      9.00        1
## 2237                    Joya Manzana N.R 1.5L   22.0     22.00        1
## 2238           Nectar Manzana Del Valle 250Ml    8.0      8.00        2
## 2239                Cerillos Flama 115 Piezas    5.5      5.50        1
## 2240               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2241                  Coca Cola Regular 355Ml    9.0      9.00        1
## 2242                  Topitos 360 Bokados 60G   10.0      7.69        1
## 2243                Ruffles Papas Con Sal 45G   13.0     13.00        1
## 2244                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2245                         Fresca N.R. 1.5L   22.0     22.00        1
## 2246            Madalenas con Mantequilla 93g   13.0     10.00        1
## 2247 Acondicionador De Telas Fresco Sol 850Ml   25.0     19.23        1
## 2248                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2249                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2250    Papel Hig Color 360Hojas Dobles 4Pzas   22.0     16.92        1
## 2251                  Coca Cola Regular 355Ml    9.0      9.00        1
## 2252                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2253          Pedigree Cachorro de Res 100 gr   11.0      8.46        2
## 2254                Cerillos Flama 115 Piezas    5.5      5.50        1
## 2255    ELOTE DORADO EN GRANOS DEL MONTE 400G   14.5     11.15        1
## 2256                    Fanta Retornable 1.5L   18.0     18.00        1
## 2257                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2258          Pedigree Cachorro de Res 100 gr   11.0      8.46        1
## 2259            Aceite Vegetal Kartamus 900Ml   31.5     24.23        1
## 2260      Danone Bipack Fresa Chocoarroz 130G   11.0     11.00        1
## 2261      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 2262           Puré De Tomate La COSTEÑA 210g    6.5      5.00        1
## 2263         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 2264                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 2265                        Peñafiel Fresa 2L   22.0     22.00        1
## 2266   FRIJOLES BAYOS REFRITOS LA SIERRA 430G   14.5     11.15        1
## 2267                Sal Refinada La Fina 500G    7.5      5.77        1
## 2268                     Mole Doña Maria 125G   21.0     16.15        2
## 2269      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 2270                 Kinder Sorpresa Niña 20g   21.0     16.15        1
## 2271            VASOS DES CONVERMEX 12OZ 25PZ   14.0     10.77        1
## 2272                       Agua Mineral 355Ml    9.0      9.00        1
## 2273                    Joya Manzana N.R 1.5L   22.0     22.00        1
## 2274              PAPEL HIGIENICO PREMIER 4PZ   28.0     21.54        1
## 2275               Coca Cola Retornable 500Ml   10.0     10.00        2
## 2276                Leche Negrito Bimbo 236Ml   10.0     10.00        1
## 2277     GARBANZOS EN SALMUERA DEL MONTE 230G   20.0     15.38        1
## 2278  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        2
## 2279                      Nutri Leche 1 Litro   16.0     12.31        1
## 2280                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2281                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2282                    Saladitas Gamesa 137G   13.0     10.00        1
## 2283            Madalenas con Mantequilla 93g   13.0     10.00        1
## 2284                           Pepsi N. R. 2L   22.0     22.00        1
## 2285                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2286  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 2287                            Pepsi N.R. 3L   34.0     34.00        1
## 2288               Blanqueador Cloralex 250Ml    5.0      3.85        1
## 2289                MANTECA VEGETAL INCA 500G   28.0     21.54        1
## 2290                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 2291                   Cheetos Torciditos 48g    8.0      8.00        2
## 2292                          Rancheritos 52g   11.0     11.00        1
## 2293                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2294                     Coca Cola Zero 600Ml   14.0     14.00        1
## 2295                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2296                          Valle Frut 2.5L   33.0     33.00        1
## 2297                        Pepsi N. R. 500Ml   10.0     10.00        1
## 2298         VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        1
## 2299                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 2300               Blanqueador Cloralex 500Ml    8.0      6.15        1
## 2301            Flash Xtra Brisa Marina 500Ml    9.5      7.31        1
## 2302                          Valle Frut 2.5L   33.0     33.00        1
## 2303                    Crema Norteñita 250ml   20.0     15.38        1
## 2304                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 2305                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2306               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2307                     Sal De Uvas Picot 5G    3.5      3.50        2
## 2308            Fabuloso Fresca Lavanda 500Ml   17.0     13.08        1
## 2309              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        2
## 2310         Crema Colgate Trip/Acc Blanc 50g   11.0      8.46        1
## 2311                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 2312                 Polvorones Marinela 113G   13.0     10.00        1
## 2313                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2314                        Ruffles Queso 50G   13.0     13.00        1
## 2315                       Doritos Nachos 53G   12.0     12.00        1
## 2316  LALA YOMI UHT VAINILLA CARTON 250ML NAL   11.5     11.50        1
## 2317      Principe Mousse Limón Marinela 106g   13.0     10.00        1
## 2318        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 2319           Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 2320         Tostadas El Gallo De Oro 90pzas.   49.0     37.69        1
## 2321                              Bonafont 1L   11.0     11.00        1
## 2322                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2323         FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 2324                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 2325                     Powerade Moras 600Ml   18.0     13.85        1
## 2326            Jumex Nectar De Durazno 440Ml   12.5     12.50        1
## 2327                            Tang Uva 15gr    5.0      3.85        1
## 2328                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2329                  Joya Manzana N. R. 2.5L   30.0     30.00        1
## 2330                    Powerade Frutas 600Ml   18.0     18.00        1
## 2331                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 2332                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 2333       Pedigree Cachorro Sobre Pollo 100g   11.0      8.46        2
## 2334       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 2335                 Pake Taxo Flaminhut 70gr   11.0      8.46        2
## 2336                        Golos Bokados 40G   10.0      7.69        1
## 2337             Sabritas Papas Habanero 42 g   13.0     13.00        2
## 2338                    Pulpy Del Valle 400Ml   12.0     12.00        1
## 2339                         Pepsi N.R. 400Ml    8.0      8.00        1
## 2340              Naranjada Jumex Frutzo 1.5L   18.0     18.00        1
## 2341                    Squirt Toronja 1.5 Lt   18.0     18.00        2
## 2342         VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        1
## 2343                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 2344                    Conchitas Encanto 60G   10.0      7.69        1
## 2345                       Doritos Nachos 53G   12.0     12.00        1
## 2346                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 2347                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2348                    Garrafón Bonafont 19L   40.0     30.77        1
## 2349               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2350                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 2351               Crema Vegetal Camelia 500G   17.0     13.08        1
## 2352                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2353   Salsa Picante Clasica La Botanera 525G   11.5      8.85        1
## 2354                     Coca Cola N.R. 355Ml   11.0      8.46        1
## 2355                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 2356 GATORADE FIERCE BLUE THUNDER MORAS BOT P   25.0     19.23        1
## 2357 KINDER DELICE CACAO PASTELITO  T1 1PZA 3   10.5      8.08        1
## 2358                  Cheetos Flaming Hot 48g    8.0      8.00        2
## 2359                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 2360  PAPEL HIGIENICO MEGA JBO 500 HOJAS 1PZA    7.5      5.77        1
## 2361               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2362                        Ruffles Queso 50G   13.0     13.00        1
## 2363                 Leche Lala Premium 500Ml   12.0     12.00        1
## 2364                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 2365                       Doritos Nachos 53G   12.0     12.00        1
## 2366            Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 2367                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 2368                Cerveza Tecate Light 16Oz   20.0     15.38        1
## 2369                     Leche Carnation 360G   19.0     14.62        1
## 2370                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2371                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 2372                Ruffles Papas Con Sal 45G   13.0     13.00        1
## 2373            Jumex Nectar De Durazno 440Ml   12.5     12.50        1
## 2374                    Leche Lala Premium 1L   20.0     20.00        1
## 2375                    Yoplait Mini Uva 100G    5.0      5.00        1
## 2376                    Crema Norteñita 250ml   20.0     15.38        1
## 2377                       Doritos Nachos 53G   12.0     12.00        2
## 2378                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2379                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 2380                         Volt Lata 473 ml   17.0     13.08        1
## 2381            Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 2382                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2383             Aceite Vegetal Cristal 500Ml   18.0     13.85        1
## 2384                   Jabon Zote Blanco 200G    9.5      7.31        1
## 2385              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 2386        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 2387          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 2388                    Conchas Tia Rosa 150G   14.0     10.77        1
## 2389                  Deliciosas Vainilla 90G    8.0      6.15        1
## 2390                       Guten Fajitas 350g   35.0     35.00        1
## 2391                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 2392                       Cigarros Link 20pz   25.0     19.23        1
## 2393                            Clamato 473Ml   18.5     18.50        1
## 2394  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 2395            Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 2396                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 2397                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2398                   Joya Durazno N.R. 1.5L   22.0     16.92        1
## 2399              Sopa Maruchan Carne Res 64G   12.0      9.23        1
## 2400       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 2401                        Negrito Bimbo 62G   10.0     10.00        1
## 2402                 MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 2403                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2404                        Ruffles Queso 50G   13.0     13.00        2
## 2405                       Doritos Nachos 53G   12.0     12.00        1
## 2406   FRIJOLES BAYOS REFRITOS LA SIERRA 430G   14.5     11.15        1
## 2407                   Powerade Lima-Limon 1L   22.0     22.00        1
## 2408            Mostaza Mccormick Frasco 210G   15.0     11.54        1
## 2409            Jarritos Sabor Mandarina 1.5L   16.0     16.00        1
## 2410                       Paketaxo Queso 65G   11.0      8.46        1
## 2411        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 2412                           Pepsi N. R. 2L   22.0     22.00        1
## 2413                   Churrumais Flamas 60g.    7.0      5.38        1
## 2414       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        2
## 2415                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2416                  Cheetos Flaming Hot 48g    8.0      8.00        2
## 2417                   Churrumais Flamas 60g.    7.0      5.38        1
## 2418                   Cheetos Torciditos 48g    8.0      8.00        1
## 2419                  Cheetos Flaming Hot 48g    8.0      8.00        2
## 2420                      Rebanadas Bimbo 2Pz    5.0      5.00        4
## 2421                            Fortileche 1L   18.0     13.85        1
## 2422                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2423                  Golos Mango Y Chile 40G   10.0      7.69        1
## 2424          Trident Xtracare Yerbabuena 16G    8.0      8.00        1
## 2425                           Pepsi N. R. 2L   22.0     22.00        1
## 2426                      Papatinas Fuego 25G    7.0      5.38        1
## 2427                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2428                 TOALLAS COCINA IRIS 60PZ   16.0     12.31        1
## 2429        Mantecadas Vainilla 6 Pzas 187.5g   18.0     18.00        1
## 2430                    Leche Lala Premium 1L   20.0     20.00        1
## 2431                            Pepsi N.R. 3L   34.0     34.00        1
## 2432                            Pepsi N.R. 3L   34.0     34.00        1
## 2433                        Seven Up N. R. 2L   22.0     22.00        1
## 2434                            Pepsi N.R. 3L   34.0     34.00        1
## 2435                            Tang Uva 15gr    5.0      3.85        1
## 2436            PURE DE PAPA VERDE VALLE 160G   20.0     20.00        1
## 2437                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 2438                 Trident Fresa 5.2gr 4 Pz    2.0      2.00        1
## 2439                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2440                   Nesquik Chocolate 200g   21.5     16.54        1
## 2441   BIBERON AVANT GDE DECORADO ROSA 8 240M   19.0     19.00        1
## 2442                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 2443                 Queso Manchego Lala 200G   38.0     38.00        1
## 2444                    Cacahuate Japones 55G    8.0      6.15        1
## 2445           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 2446            POLVO PARA HORNEAR REXAL 100G   12.0      9.23        1
## 2447                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2448               Arcoiris Fresa Gamesa 75gr   12.0      9.23        1
## 2449           Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 2450      Lechita Santa Clara Chocolate 200ml    9.5      9.50        1
## 2451              Yoghurt Cereal Colores 100G    9.5      9.50        2
## 2452     CREMA DENTAL CLEAN MINT TOTAL12 22ML    7.0      5.38        1
## 2453                  AXE DARK TEMTATION 90ML   25.0     25.00        1
## 2454                 Veladora Limonera Nevada   14.5     11.15        2
## 2455                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2456                   Nesquik Chocolate 200g   21.5     16.54        1
## 2457            VASOS DES CONVERMEX 12OZ 25PZ   14.0     10.77        1
## 2458                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 2459                   Choco Milk Choc 160 gr   21.5     21.50        1
## 2460 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 2461             Sabritas Papas Habanero 42 g   13.0     13.00        1
## 2462                Crema Vegetal Camelia 1Kg   27.0     20.77        1
## 2463                        Powerade Frutas1L   22.0     22.00        1
## 2464                    Pan Molido Bimbo 210G   15.0     11.54        1
## 2465                        Sol Clamato 473Ml   30.0     23.08        2
## 2466           MARLBORO ROJO 14S FLIP-TOP BOX   47.0     36.15        1
## 2467                         Choco Lala 500Ml   17.0     17.00        1
## 2468        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 2469                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2470    Papel Hig Color 360Hojas Dobles 4Pzas   22.0     16.92        1
## 2471                           Pepsi N. R. 2L   22.0     22.00        1
## 2472                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 2473                      ARROZ DIAMANTE 225G    9.0      6.92        1
## 2474         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 2475         Strips Bokados Queso Y Chile 75G   10.0      7.69        1
## 2476                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 2477              Sabritas Papas Adobadas 45G   13.0     13.00        1
## 2478                        Ruffles Queso 50G   13.0     13.00        1
## 2479                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2480                        Nutri Leche 1.89L   29.0     29.00        1
## 2481                      Cacahuate 3 Mix 80G   14.0     10.77        1
## 2482                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2483                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2484                    Leche Lala Premium 1L   20.0     20.00        1
## 2485              Sopa Maruchan Carne Res 64G   12.0      9.23        1
## 2486               Arcoiris Fresa Gamesa 75gr   12.0      9.23        1
## 2487                      Zucaritas Sobre 30G    8.0      6.15        1
## 2488                 Leche Lala Premium 500Ml   12.0     12.00        1
## 2489       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 2490     Frutsi Sabor Ponche De Frutas 250 Ml    5.0      5.00        1
## 2491  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 2492         Strips Bokados Queso Y Chile 75G   10.0      7.69        1
## 2493                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 2494                     Salsa Valentina 370M   13.0     10.00        1
## 2495                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2496            Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 2497                Multigrano Nuez Bimbo 34G    8.0      8.00        1
## 2498                    Leche Lala Premium 1L   20.0     20.00        2
## 2499 PALMOLIVE NATURALS SENSACION HUMECT.OLIV   14.0     10.77        1
## 2500                    Leche Lala Premium 1L   20.0     20.00        1
## 2501                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2502                    Leche Lala Premium 1L   20.0     20.00        1
## 2503                    Pulpy Del Valle 400Ml   12.0     12.00        1
## 2504                     Pepsi Light N.R 2.5L   27.0     20.77        1
## 2505                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2506                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 2507                        Golos Bokados 40G   10.0      7.69        1
## 2508              Sabritas Papas Adobadas 45G   13.0     13.00        1
## 2509                Ruffles Papas Con Sal 45G   13.0     13.00        1
## 2510       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 2511        Cacahuates Enchilados Bokados 45G    8.0      6.15        1
## 2512         Chicharron De Cerdo Sabritas 30G   12.0      9.23        1
## 2513                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 2514                       Paketaxo Queso 65G   11.0      8.46        1
## 2515                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 2516                   Frutimax De Jamaica 7g    3.5      3.50        1
## 2517   Veladora Limonero Supremo C/Aroma 1 Pz   14.5     11.15        1
## 2518            VELADORA SAN JUDAS TADEO 400G   31.5     24.23        1
## 2519               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2520                 Leche Lala Premium 500Ml   12.0     12.00        1
## 2521                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2522                    Leche Lala Premium 1L   20.0     20.00        1
## 2523                 MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 2524                       Seven Up N.R. 1.5L   18.0     18.00        1
## 2525                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2526                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 2527                   Gatorade Naranja 750Ml   20.0     15.38        1
## 2528                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2529                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 2530                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 2531                  Pan Bimbo Integral 720G   37.0     28.46        1
## 2532                 MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 2533                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 2534            Aceite Vegetal Kartamus 900Ml   31.5     24.23        1
## 2535                   Pinguinos Marinela 80G   15.0     11.54        1
## 2536        GERBER VERD. CON RES Y ARROZ 113G   12.0     12.00        1
## 2537                        Sol Clamato 473Ml   30.0     23.08        1
## 2538                     Powerade Moras 600Ml   18.0     13.85        1
## 2539 LALA YOMI UHT CHOCOLATE CARTON 250ML NAL   11.5     11.50        2
## 2540                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2541                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 2542                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2543                   Fanta Naranja N.R 2.5L   30.0     23.08        1
## 2544                  Joya Manzana N. R. 2.5L   30.0     30.00        1
## 2545                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 2546                    Joya Manzana N.R 1.5L   22.0     22.00        1
## 2547            Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 2548               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 2549                      Paketaxo Queso 215g   36.0     27.69        1
## 2550                     Tang Sabor Fresa 15g    5.0      5.00        1
## 2551                    Crema Norteñita 250ml   20.0     15.38        1
## 2552                   Tang Te Helado 15G 2Lt    5.0      5.00        1
## 2553                           Pepsi N. R. 2L   22.0     22.00        1
## 2554                   Churrumais Flamas 60g.    7.0      5.38        1
## 2555       Churritos Leo Frituras De Maíz 60G   10.0      7.69        1
## 2556                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 2557      Lechita Santa Clara Chocolate 200ml    9.5      9.50        1
## 2558                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 2559                        Sol Clamato 473Ml   30.0     23.08        1
## 2560          Refresco De Toronja Fresca 2.5L   30.0     30.00        1
## 2561                      Chichos Encanto 60G   10.0      7.69        1
## 2562              Bran Frut Barra De Piña 40G    8.0      8.00        1
## 2563                 Manzanita Sol N.R. 400Ml    8.0      8.00        1
## 2564                      Detergente Ace 500G   21.0     16.15        1
## 2565               Blanqueador Cloralex 500Ml    8.0      6.15        1
## 2566           MARLBORO ROJO 14S FLIP-TOP BOX   47.0     36.15        1
## 2567                   Jabon Zote Blanco 200G    9.5      7.31        1
## 2568      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 2569      Axion Limon Bicarbonato Activo 250G   12.0      9.23        1
## 2570                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 2571                    Leche Lala Premium 1L   20.0     20.00        1
## 2572                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2573                 Snickers Satisface 21.5g    8.0      6.15        1
## 2574                  Salsa De La Viuda 150Ml   16.5     12.69        1
## 2575                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2576               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2577    ELOTE DORADO EN GRANOS DEL MONTE 225G   10.0      7.69        1
## 2578               ENSALADA DE ATÉN TUNY 135G   17.5     13.46        1
## 2579               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 2580                       Cigarros Link 20pz   25.0     19.23        1
## 2581    Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 2582           Lechita Fresa 200ml Sta. Clara    9.5      9.50        1
## 2583        Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 2584                       Doritos Nachos 53G   12.0     12.00        1
## 2585                        Pepsi N. R. 500Ml   10.0     10.00        1
## 2586                    Saladitas Gamesa 137G   13.0     10.00        3
## 2587                   Zuko Sabor Durazno 15g    5.0      5.00        2
## 2588            Fabuloso Fresca Lavanda 500Ml   17.0     13.08        1
## 2589       Detergente Salvo Microesferas 250G   12.0      9.23        1
## 2590                          Valle Frut 2.5L   33.0     33.00        1
## 2591                               Epura 1.5L   13.0     13.00        1
## 2592                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 2593              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 2594            Jumex Nectar De Durazno 440Ml   12.5     12.50        1
## 2595            Cepillo Colgate Premier Clean   12.0     12.00        1
## 2596               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2597                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2598                               Epura 1.5L   13.0     13.00        1
## 2599                      Be-Light Jamaica 1L   13.0     13.00        1
## 2600                 Electrolit Manzana 625ml   23.5     18.08        2
## 2601          Suero Electrolit Naranja 625 Ml   23.5     18.08        1
## 2602   Veladora Limonero Supremo C/Aroma 1 Pz   14.5     11.15        1
## 2603                            Pepsi N.R. 3L   34.0     34.00        1
## 2604      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 2605                   Choco Milk Choc 160 gr   21.5     21.50        1
## 2606            Detergente Ariel Oxiazul 500G   24.0     18.46        1
## 2607  FRIJOLES BAYOS REFRITOS LA COSTEÑA 440G   14.0     10.77        1
## 2608                    Crema Norteñita 250ml   20.0     15.38        1
## 2609                         Choco Lala 500Ml   17.0     17.00        1
## 2610                        Negrito Bimbo 62G   10.0     10.00        1
## 2611                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 2612                   Jugo Durazno Jumex 1Lt   23.0     17.69        1
## 2613                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2614                       Doritos Nachos 53G   12.0     12.00        1
## 2615                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 2616              CREMA ENJUAGUE MONELI 220ML    7.0      5.38        1
## 2617                   Generosa Guayaba 413ml   12.0      9.23        1
## 2618                  Flash Xtra Floral 500Ml    9.5      7.31        1
## 2619               Tocino Ahumado Chimex 170G   44.0     44.00        1
## 2620        Knorr Sazonador Mi Arroz Rojo 17g    6.5      5.00        1
## 2621            VASOS DES CONVERMEX 12OZ 25PZ   14.0     10.77        1
## 2622                    Crema Norteñita 250ml   20.0     15.38        1
## 2623                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 2624                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 2625                         Volt Lata 473 ml   17.0     13.08        1
## 2626                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2627                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2628                        Ajax Bicloro 388G   24.0     18.46        1
## 2629                           Tang Melón 15g    5.0      5.00        1
## 2630                          Zuko Sandía 15g    5.0      5.00        1
## 2631                         Pepsi N. R. 2.5L   27.0     27.00        2
## 2632                  Joya Manzana N. R. 2.5L   30.0     30.00        1
## 2633         VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        1
## 2634                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 2635                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2636                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2637                       Sidral Mundet 2.5L   30.0     23.08        1
## 2638                 Snickers Satisface 21.5g    8.0      6.15        2
## 2639          Prispas A La Francesa Boka2 50G   10.0      7.69        1
## 2640     Frutsi Sabor Ponche De Frutas 250 Ml    5.0      5.00        1
## 2641                          Squirt N. R. 2L   22.0     16.92        1
## 2642                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 2643                     Tang Piña Colada 15g    5.0      5.00        1
## 2644                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2645                         Fresca N.R. 1.5L   22.0     22.00        1
## 2646                Coca Cola Retornable 2.5L   27.0     27.00        3
## 2647 Frijoles Negros Enteros 560gr La COSTEÑA   15.5     11.92        1
## 2648                 Choco Roles Marinela 67G   15.0     11.54        1
## 2649                     Gansito Marinela 50G   10.0      7.69        1
## 2650                Cerillos Flama 115 Piezas    5.5      5.50        1
## 2651                      Frutimax Naranja 7G    3.5      3.50        2
## 2652               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2653                         Pepsi N.R. 600Ml   13.0     13.00        1
## 2654                     Detergente Roma 250G   10.0      7.69        1
## 2655                  Blanqueador Cloralex 1L   13.0     10.00        1
## 2656              Sopa Maruchan Carne Res 64G   12.0      9.23        1
## 2657                 Manzanita Sol N.R. 400Ml    8.0      8.00        1
## 2658     Macarrones con Queso 200g La Moderna   25.0     19.23        2
## 2659       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 2660                            Pepsi N.R. 3L   34.0     34.00        1
## 2661                     Salsa Valentina 370M   13.0     10.00        1
## 2662       Detergente Foca Biodegradable 250G   10.5      8.08        1
## 2663                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 2664              Salsa Catsup Del Monte 220G   11.0      8.46        1
## 2665                        Coca Cola N.R. 2L   28.0     28.00        1
## 2666                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 2667            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 2668                           Pepsi N. R. 2L   22.0     22.00        1
## 2669                 Mirinda Naranja N. R. 2L   22.0     22.00        1
## 2670                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2671      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 2672   Salsa Picante Clasica La Botanera 525G   11.5      8.85        1
## 2673            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 2674                        ARROZ NORVER 250G    8.5      6.54        1
## 2675                Squirt Toronja N.R. 600Ml   13.0     10.00        1
## 2676                      ARROZ DIAMANTE 225G    9.0      6.92        1
## 2677 GATORADE FIERCE BLUE THUNDER MORAS BOT P   25.0     19.23        1
## 2678                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 2679                      Gatorade Naranja 1L   25.0     25.00        1
## 2680                 Gelatina Dany Fresa 125G    6.5      6.50        2
## 2681                            Pepsi N.R. 3L   34.0     34.00        1
## 2682                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2683              Bimbollos Extra Grandes 6Pz   34.0     26.15        2
## 2684                    Pan Molido Bimbo 210G   15.0     11.54        1
## 2685                 Gelatina Dany Limon 125G    6.5      6.50        2
## 2686                  MEDIA CREMA NESTLE 225G   16.0     12.31        1
## 2687                     Leche Carnation 360G   19.0     14.62        1
## 2688          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 2689     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 2690                Nescafe Clásico sobre 14g   10.0      7.69        1
## 2691                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2692 DANONINO FRESA BAJO EN GRASA SOLIDO 4PZA    8.0      8.00        4
## 2693          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 2694                   Pinguinos Marinela 80G   15.0     11.54        2
## 2695       CHIPOTLES ADOBADOS LA COSTEÑA 220G   21.5     16.54        1
## 2696           Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 2697           Pure De Tomate Del Fuerte 345G   10.5      8.08        1
## 2698       Gatorade De Ponche De Frutas 600Ml   21.0     21.00        1
## 2699                    Doritos Incognita 47G   13.0     13.00        1
## 2700                  Blanqueador Cloralex 1L   13.0     10.00        1
## 2701                  Joya Manzana N.R 600 Ml   14.0     10.77        1
## 2702                        ARROZ NORVER 250G    8.5      6.54        2
## 2703                  Mole Rogelio Bueno 245G   28.0     21.54        1
## 2704                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 2705                   Cheetos Torciditos 48g    8.0      8.00        1
## 2706                            Pepsi N.R. 3L   34.0     34.00        1
## 2707                     Pepsi Light N.R 2.5L   27.0     20.77        1
## 2708                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2709           Sabrita Jalapeño Crujiente 46g   13.0     13.00        1
## 2710         VASOS DESECHABLES 10OZ CONVERMEX   12.0      9.23        1
## 2711 PLATO CHAROLA TERMICA #66 CONVERMEX C/50   14.5     11.15        1
## 2712                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2713  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 2714              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 2715     GARBANZOS EN SALMUERA DEL MONTE 230G   20.0     15.38        1
## 2716                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2717                       Doritos Nachos 53G   12.0     12.00        1
## 2718                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 2719               Nectar Guayaba Jumex 250Ml    8.0      8.00        1
## 2720                      ARROZ DIAMANTE 225G    9.0      6.92        1
## 2721                        Ruffles Queso 50G   13.0     13.00        1
## 2722                    Saladitas Gamesa 137G   13.0     10.00        1
## 2723                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2724          Sazonador Zona Sal Con Ajo 175G   30.0     23.08        1
## 2725                       Doritos Nachos 53G   12.0     12.00        1
## 2726                  H24 Casa Y Jardin 426Ml   53.0     40.77        1
## 2727                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2728                        Coca Cola N.R. 2L   28.0     28.00        1
## 2729                  Golos Mango Y Chile 40G   10.0      7.69        1
## 2730 PALMOLIVE NEUTRO BALANCE DERMOLIMPIADOR    19.0     14.62        1
## 2731            KOTEX MANZANILLA CON ALAS 10P   17.0     13.08        1
## 2732              PAPEL HIGIENICO PREMIER 4PZ   28.0     21.54        1
## 2733                  Blanqueador Cloralex 1L   13.0     10.00        1
## 2734                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 2735          Jamón Americano De Pavo 170 Grs   29.0     29.00        1
## 2736                     Gansito Marinela 50G   10.0      7.69        2
## 2737  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 2738                     Cheese Puffs Leo 45G    6.0      4.62        2
## 2739                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2740                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 2741                   Joya Ponche N. R. 2.5L   30.0     23.08        1
## 2742      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 2743            Tostadas El Gallo De Oro 250G   19.0     14.62        1
## 2744                       Doritos Nachos 53G   12.0     12.00        1
## 2745                        Pepsi N. R. 500Ml   10.0     10.00        1
## 2746                       Cigarros Link 20pz   25.0     19.23        1
## 2747                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2748                        Ruffles Queso 50G   13.0     13.00        1
## 2749   Salsa Picante Clasica La Botanera 525G   11.5      8.85        1
## 2750                            Pepsi N.R. 3L   34.0     34.00        1
## 2751                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2752                   Tang Sabor Jamaica 15g    5.0      3.85        1
## 2753                        Powerade Moras 1L   22.0     16.92        1
## 2754                           Tang Melón 15g    5.0      5.00        1
## 2755                     Tang Piña Colada 15g    5.0      5.00        1
## 2756                Sal Refinada La Fina 500G    7.5      5.77        1
## 2757                    Saladitas Gamesa 137G   13.0     10.00        1
## 2758               Garrafon Electropura 20 Lt   38.0     29.23        1
## 2759                     Frutsi Manzana 250Ml    5.0      5.00        2
## 2760          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 2761                            Pepsi N.R. 3L   34.0     34.00        1
## 2762                    Joya Manzana N.R 1.5L   22.0     22.00        1
## 2763               Coca Cola Retornable 500Ml   10.0     10.00        2
## 2764            TOALLA BUENAS NOCHES ALAS 8PZ   27.0     20.77        1
## 2765                  Jugo Lala Natural 330Ml   13.5     13.50        1
## 2766               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2767                Chamoy El Torito Regio 1L   18.0     13.85        1
## 2768       Mayonesa Hellmann´S Con Limon 105G   12.5      9.62        1
## 2769                Mirinda Naranja N.R. 1.5L   18.0     18.00        1
## 2770                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 2771                        Ruffles Queso 50G   13.0     13.00        1
## 2772     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 2773                    Crema Norteñita 250ml   20.0     15.38        1
## 2774                  MEDIA CREMA NESTLE 225G   16.0     12.31        1
## 2775                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2776           Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 2777            Pure De Tomate Del Fuerte 1Kg   26.0     20.00        1
## 2778                           Pepsi N. R. 2L   22.0     22.00        1
## 2779                Mirinda Naranja N.R. 2.5L   25.0     19.23        1
## 2780                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2781                       Seven Up N.R. 1.5L   18.0     18.00        1
## 2782                   Joya Ponche N. R. 2.5L   30.0     23.08        1
## 2783          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 2784 GATORADE FIERCE BLUE THUNDER MORAS BOT P   25.0     19.23        1
## 2785                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2786                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 2787  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 2788           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 2789            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 2790  DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        1
## 2791                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2792            Fabuloso Fresca Lavanda 500Ml   17.0     13.08        1
## 2793       Detergente Salvo Microesferas 250G   12.0      9.23        1
## 2794            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 2795                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2796                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 2797                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2798                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 2799                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 2800                      Sidral Mundet 500Ml   10.0      7.69        1
## 2801                    Joya Manzana N.R 1.5L   22.0     22.00        1
## 2802                  Gelatina Dany Piña 125G    6.5      6.50        1
## 2803                              Epura 10.1L   31.0     23.85        1
## 2804                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2805           Pure De Tomate Del Fuerte 345G   10.5      8.08        1
## 2806               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 2807                            Sangria 355Ml    9.0      9.00        1
## 2808                       Agua Mineral 355Ml    9.0      9.00        1
## 2809                            Pepsi N.R. 3L   34.0     34.00        2
## 2810                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2811       Jamon De Pavo Y Cerdo Chimex 162Gr   15.0     15.00        1
## 2812                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2813                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2814                     Gansito Marinela 50G   10.0      7.69        1
## 2815               Garrafon Electropura 20 Lt   38.0     29.23        1
## 2816                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 2817                        Sol Clamato 473Ml   30.0     23.08        4
## 2818                            Pepsi N.R. 3L   34.0     34.00        2
## 2819                Squirt Toronja 2.5 Litros   25.0     25.00        1
## 2820                    Crema Norteñita 250ml   20.0     15.38        1
## 2821    Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 2822          Danonino Maxi Fresa Danone 170G    8.0      8.00        1
## 2823                               Epura 1.5L   13.0     13.00        2
## 2824                    Leche Lala Premium 1L   20.0     20.00        1
## 2825                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 2826              Pan Bimbo Blanco Chico 395G   25.0     19.23        1
## 2827                    Leche Lala Premium 1L   20.0     20.00        1
## 2828                   Joya Ponche N.R. 500Ml   13.0     13.00        1
## 2829                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 2830                         Fresca N.R. 1.5L   22.0     22.00        1
## 2831                     Jamon Vir Fud 250Grs   49.0     49.00        1
## 2832                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2833        TEQUILA REPOSADO EL JIMADOR 950ML  260.0    200.00        1
## 2834 CHILES SERRANOS ESCABECHE LA COSTEÑA105G    7.0      5.38        1
## 2835                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 2836      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 2837                   Pinguinos Marinela 80G   15.0     11.54        1
## 2838                Squirt Toronja 2.5 Litros   25.0     25.00        1
## 2839            Tostadas El Gallo De Oro 250G   19.0     14.62        1
## 2840               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2841                     Sal De Uvas Picot 5G    3.5      3.50        2
## 2842           Queso Tipo Sierra Norteño 170G   27.5     21.15        1
## 2843                 Choco Roles Marinela 67G   15.0     11.54        1
## 2844              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 2845                          Bokados Mix 90G   12.0      9.23        1
## 2846                       Pepsi Light 1.5 Lt   18.0     13.85        2
## 2847                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 2848        Salchicha Pavo Gua Sal Tlf 500Grs   38.0     38.00        1
## 2849                            Pepsi N.R. 3L   34.0     34.00        1
## 2850                            Pepsi N.R. 3L   34.0     34.00        1
## 2851        FRIJOLES ENTEROS RANCH STYLE 425G   21.0     16.15        1
## 2852                            Pepsi N.R. 3L   34.0     34.00        2
## 2853                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 2854                   Joya Ponche N. R. 2.5L   30.0     23.08        1
## 2855                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2856                         Pepsi N.R. 600Ml   13.0     13.00        1
## 2857                           Joya Uva 600Ml   14.0     10.77        1
## 2858                Cerillos Flama 115 Piezas    5.5      5.50        1
## 2859                    Joya Manzana R. 500Ml   10.0     10.00        1
## 2860                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 2861               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 2862                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2863                  Del Valle Durazno 500Ml   13.0     13.00        1
## 2864                        Seven Up N. R. 2L   22.0     22.00        1
## 2865                           Pepsi N. R. 2L   22.0     22.00        1
## 2866                         Pepsi N.R. 600Ml   13.0     13.00        2
## 2867 PALMOLIVE NATURALS SENSACION HUMECT.OLIV   14.0     10.77        1
## 2868                            Pepsi N.R. 3L   34.0     34.00        1
## 2869                 MANTECA VEGETAL INCA 1KG   40.5     31.15        1
## 2870               Chicle Bubbaloo Fresa 5.5g    1.5      1.50        1
## 2871                    Saladitas Gamesa 137G   13.0     10.00        1
## 2872        RAJAS DE Jalapeño LA COSTEÑA 105G    7.0      5.38        1
## 2873                    Crema Norteñita 250ml   20.0     15.38        1
## 2874                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2875              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 2876                        Pepsi N. R. 500Ml   10.0     10.00        1
## 2877                       Paketaxo Queso 65G   11.0      8.46        1
## 2878                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2879            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 2880                Tortillinas TÉa Rosa 10Pz   13.0     10.00        1
## 2881             LECHE NIDO KINDER BOLSA 114G   26.0     26.00        1
## 2882                       Doritos Nachos 53G   12.0     12.00        1
## 2883                   Cheetos Torciditos 48g    8.0      8.00        1
## 2884                          Rancheritos 52g   11.0     11.00        1
## 2885                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2886                Coca Cola Retornable 2.5L   27.0     27.00        1
## 2887                      Cacahuate 3 Mix 80G   14.0     10.77        1
## 2888                      Nutri Leche 1 Litro   16.0     12.31        1
## 2889                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 2890                      Epix  Ponche 180Ml.    8.0      8.00        1
## 2891            VASOS DES CONVERMEX 12OZ 25PZ   14.0     10.77        1
## 2892                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 2893                    Saladitas Gamesa 137G   13.0     10.00        1
## 2894                       Doritos Nachos 53G   12.0     12.00        1
## 2895              Pulpy Mango del Valle 400ml   12.0     12.00        1
## 2896                        Negrito Bimbo 62G   10.0     10.00        1
## 2897                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2898                 MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 2899                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2900 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 2901                    Saladitas Gamesa 137G   13.0     10.00        2
## 2902                         Mamut Gamesa 44G    6.0      4.62        2
## 2903                            Pepsi N.R. 3L   34.0     34.00        1
## 2904                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 2905                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 2906                Squirt Toronja 2.5 Litros   25.0     25.00        1
## 2907       Milky Way Chocolate Snack Bar 22Gr    8.0      6.15        2
## 2908                 Veladora Limonera Nevada   14.5     11.15        1
## 2909                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2910                    Conchitas Encanto 60G   10.0      7.69        1
## 2911                   Cheetos Torciditos 48g    8.0      8.00        1
## 2912          Jugo De 8 Verduras Herdez 335Ml   11.0     11.00        1
## 2913           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 2914            Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 2915           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 2916            Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 2917                        ARROZ NORVER 250G    8.5      6.54        1
## 2918            Tostadas El Gallo De Oro 250G   19.0     14.62        1
## 2919        Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 2920    Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 2921                  Cheetos Flaming Hot 48g    8.0      8.00        2
## 2922                        Seven Up N. R. 2L   22.0     22.00        1
## 2923                 NECTAR MANGO JUMEX 250ML    8.0      8.00        2
## 2924                       Doritos Nachos 53G   12.0     12.00        1
## 2925                     Coca Cola N.R. 600Ml   14.0     14.00        2
## 2926                   Frutimax De Jamaica 7g    3.5      3.50        2
## 2927              Conchas Bimbo Vainilla 120G   10.0      7.69        2
## 2928                Cerillos Flama 115 Piezas    5.5      5.50        1
## 2929                              Epura 600Ml    8.0      8.00        1
## 2930                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 2931                        Coca Cola N.R. 2L   28.0     28.00        1
## 2932              Sopa Maruchan Carne Res 64G   12.0      9.23        1
## 2933                  Cheetos Flaming Hot 48g    8.0      8.00        3
## 2934              Semilla Girasol Bokados 40G    8.0      6.15        1
## 2935                            Pepsi N.R. 3L   34.0     34.00        1
## 2936  FRIJOLES BAYOS REFRITOS LA COSTEÑA 440G   14.0     10.77        1
## 2937                   Tang Sabor Jamaica 15g    5.0      3.85        1
## 2938                        Frutimax Limon 7g    3.5      3.50        1
## 2939                   Frutimax De Jamaica 7g    3.5      3.50        1
## 2940                       Cigarros Link 20pz   25.0     19.23        1
## 2941                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2942     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 2943               Coca Cola Retornable 500Ml   10.0     10.00        1
## 2944               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 2945                            Pepsi N.R. 3L   34.0     34.00        1
## 2946                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2947           Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 2948              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 2949                         Pepsi N. R. 2.5L   27.0     27.00        1
## 2950                    Leche Lala Premium 1L   20.0     20.00        1
## 2951                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 2952                Cremax De Nieve Fresa 90G   12.0      9.23        1
## 2953                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 2954      Yoghurt Beber Durazno Yoplait 220Ml   10.0     10.00        1
## 2955            Yoghurt  Beber Fresa Ypt 220G   10.0     10.00        1
## 2956                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 2957                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 2958           Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 2959                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 2960                   Cheetos Torciditos 48g    8.0      8.00        1
## 2961                        Pepsi N. R. 500Ml   10.0     10.00        1
## 2962        Paketaxo Mezcladito 170g Sabritas   25.0     19.23        1
## 2963          Danonino Maxi Fresa Danone 170G    8.0      8.00        1
## 2964            DANUP P/BEBER FRESA 220GR NAL   11.5     11.50        1
## 2965           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 2966                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2967            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 2968          Nutri Yoghurt Fresa/Cereal 450g   12.5     12.50        1
## 2969  Salsa Picante Clasica La Botanera 1030G   20.0     15.38        1
## 2970 ACT II PALOMITAS P/MICROONDAS SABOR MANT   12.0      9.23        1
## 2971            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 2972  Chicharron Harina Boka2 Chile Limon 45G    5.0      3.85        1
## 2973        CREMA ENJUAGUE MONELI  ROSA 430ML   10.5      8.08        1
## 2974                    Coca Cola Light 355Ml    9.0      6.92        3
## 2975                    Leche Lala Premium 1L   20.0     20.00        1
## 2976        Salchicha Para Asar Chimex 800Grs   65.0     65.00        1
## 2977                              Epura 10.1L   31.0     23.85        1
## 2978          Refresco De Toronja Fresca 2.5L   30.0     30.00        1
## 2979                          Pepsi N.R. 1.5L   18.0     18.00        1
## 2980                           Tang Melón 15g    5.0      5.00        1
## 2981                 Gelatina Dany Fresa 125G    6.5      6.50        4
## 2982                 Gelatina Dany Limon 125G    6.5      6.50        2
## 2983                Tix Tix Chupabarritas 12g    4.0      4.00        2
## 2984                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 2985            Flan Danette Vainilla 100Grs.    7.5      7.50        2
## 2986                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2987              Palomitas Poffets Queso 26G    8.0      6.15        2
## 2988                Coca Cola Retornable 1.5L   18.0     18.00        1
## 2989                     Joya Fresa N.R. 1.5L   22.0     16.92        1
## 2990                    Encanton Surtimix 40g   10.0      7.69        1
## 2991                Gatorade Lima Limon 750Ml   20.0     20.00        2
## 2992    Gall Flor de Naranjo Gamesa 4pz 100gr   12.0      9.23        1
## 2993 Yoghurt Bebible Licuado Fresa Nestle 500   19.0     19.00        2
## 2994                Marlboro 14´s Light 100´s   47.0     36.15        1
## 2995  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 2996        FRIJOLES ENTEROS RANCH STYLE 425G   21.0     16.15        1
## 2997                    Powerade Frutas 600Ml   18.0     18.00        1
## 2998              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 2999          Panquecitos C/Gota De Chocolate   15.0     11.54        1
## 3000                    Leche Lala Premium 1L   20.0     20.00        1
## 3001                            Pepsi N.R. 3L   34.0     34.00        1
## 3002            Detergente Blanca Nieves 250G   10.5      8.08        1
## 3003 T Femenina Princess Nocturna C/Alas 8Pza   23.5     18.08        1
## 3004                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3005         Strips Bokados Queso Y Chile 75G   10.0      7.69        1
## 3006                        Ruffles Queso 50G   13.0     13.00        1
## 3007                          Leche Lala 1.8L   33.0     33.00        1
## 3008                      ARROZ DIAMANTE 225G    9.0      6.92        1
## 3009                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 3010            VELADORA SAN JUDAS TADEO 400G   31.5     24.23        4
## 3011       Mantecadas Nuez Bimbo 6 Pzas 84.5g   18.0     18.00        2
## 3012        Mantecadas Vainilla 6 Pzas 187.5g   18.0     18.00        2
## 3013                            Pepsi N.R. 3L   34.0     34.00        1
## 3014                Cerveza Tecate Light 16Oz   20.0     15.38        3
## 3015              Bimbollos Extra Grandes 6Pz   34.0     26.15        1
## 3016              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3017             Sabritas Papas Con Limon 40G   13.0     13.00        1
## 3018                       Jarritos Piña 1.5L   16.0     16.00        1
## 3019                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3020            DANUP P/BEBER FRESA 220GR NAL   11.5     11.50        1
## 3021                           Pepsi N. R. 2L   22.0     22.00        1
## 3022                     Yoplait Durazno 330G   14.0     14.00        1
## 3023               ATÉn El Dorado Aceite 140g   14.0     10.77        2
## 3024                       Cigarros Link 20pz   25.0     19.23        1
## 3025                     Powerade Moras 600Ml   18.0     13.85        1
## 3026           MARLBORO ROJO 14S FLIP-TOP BOX   47.0     36.15        1
## 3027                    Leche Lala Premium 1L   20.0     20.00        1
## 3028                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3029                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3030               Coca Cola Retornable 500Ml   10.0     10.00        4
## 3031                         Panque Nuez 270G   30.0     30.00        1
## 3032            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 3033                 Halls Yerbabuena 25g 9pz    7.0      7.00        1
## 3034                    Joya Manzana R. 500Ml   10.0     10.00        2
## 3035                      Nutri Leche 1 Litro   16.0     12.31        1
## 3036       CHIPOTLES ADOBADOS LA COSTEÑA 105G   11.5      8.85        1
## 3037              ABSORSEC TOALLA HUMEDA 70PZ   21.5     21.50        1
## 3038                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 3039                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 3040                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 3041                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3042               Garrafon Electropura 20 Lt   38.0     29.23        2
## 3043               Jabon Axion Liquido 280ml.   16.5     12.69        1
## 3044                         Pepsi N.R. 600Ml   13.0     13.00        1
## 3045           MARLBORO ROJO 14S FLIP-TOP BOX   47.0     36.15        1
## 3046                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3047                     Leche Carnation 360G   19.0     14.62        1
## 3048                        ARROZ NORVER 250G    8.5      6.54        1
## 3049                 CAJETA YOPI QUEMADA 250G   24.0     18.46        1
## 3050                 Sal Refinada La Fina 1Kg   14.0     10.77        1
## 3051                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3052                         Lucas Sandia 24g    7.0      7.00        3
## 3053                            Pepsi N.R. 3L   34.0     34.00        1
## 3054                            Pepsi N.R. 3L   34.0     34.00        1
## 3055   FRIJOLES BAYOS REFRITOS LA SIERRA 430G   14.5     11.15        1
## 3056                      Epix  Ponche 180Ml.    8.0      8.00        1
## 3057     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 3058                              Epura 10.1L   31.0     23.85        1
## 3059                          Rancheritos 52g   11.0     11.00        1
## 3060                       Doritos Nachos 53G   12.0     12.00        1
## 3061                        Sol Clamato 473Ml   30.0     23.08        1
## 3062 GATORADE FIERCE BLUE THUNDER MORAS BOT P   25.0     19.23        1
## 3063                         Pepsi N.R. 600Ml   13.0     13.00        1
## 3064   Veladora Limonero Supremo C/Aroma 1 Pz   14.5     11.15        1
## 3065                   Pinguinos Marinela 80G   15.0     11.54        3
## 3066   Veladora Limonero Supremo C/Aroma 1 Pz   14.5     11.15        1
## 3067               Coca Cola Retornable 500Ml   10.0     10.00        5
## 3068                         Panque Nuez 270G   30.0     30.00        1
## 3069  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 3070                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3071                        ARROZ NORVER 250G    8.5      6.54        1
## 3072                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3073                    Leche Lala Premium 1L   20.0     20.00        1
## 3074                        Pepsi N. R. 500Ml   10.0     10.00        1
## 3075                      Nutri Leche 1 Litro   16.0     12.31        1
## 3076                  Joya Manzana N.R. 500Ml   13.0     13.00        1
## 3077                    Leche Lala Premium 1L   20.0     20.00        1
## 3078                            Pepsi N.R. 3L   34.0     34.00        1
## 3079                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3080                         Lucas Sandia 24g    7.0      7.00        1
## 3081 BOKADOS TOTOPITOS MAIZ GRILL BSA 65 GR N   10.0      7.69        1
## 3082                   Pinguinos Marinela 80G   15.0     11.54        1
## 3083                        Ruffles Queso 50G   13.0     13.00        1
## 3084            Principe Chocolate Blanco 88G   13.0     10.00        1
## 3085                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3086                       KRAZY KOLA LOKA 2G   22.5     22.50        1
## 3087                        Ruffles Queso 50G   13.0     13.00        1
## 3088                   Doritos Pizzerolas 47G   12.0      9.23        1
## 3089        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 3090                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3091               Topitos Nachos Bokados 65G   10.0      7.69        1
## 3092                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 3093                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3094                     Coca Cola Zero 600Ml   14.0     14.00        1
## 3095                     Gatorade Limon 600Ml   20.0     20.00        1
## 3096             Trident Yerbabuena 4´s 5.2gr    2.0      2.00        1
## 3097                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3098                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 3099             Valle Frut Citrus Punch 1.5L   22.0     22.00        1
## 3100                    Leche Lala Premium 1L   20.0     20.00        1
## 3101                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3102                    Saladitas Gamesa 137G   13.0     10.00        1
## 3103                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3104            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 3105        PRESTOBARBA3 MAQUINA GILLETTE 1PZ   22.0     22.00        1
## 3106       Mantecadas Nuez Bimbo 6 Pzas 84.5g   18.0     18.00        1
## 3107            Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 3108        Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 3109                        Ruffles Queso 50G   13.0     13.00        1
## 3110             Sabritas Papas Con Limon 40G   13.0     13.00        1
## 3111             Sabritas Papas Habanero 42 g   13.0     13.00        1
## 3112       Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 3113              Sopa Maruchan Carne Res 64G   12.0      9.23        2
## 3114                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3115                         Lucas Sandia 24g    7.0      7.00        1
## 3116                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3117           Cremax De Nieve Chocolate 90Gr   12.0      9.23        1
## 3118 LALA YOMI UHT CHOCOLATE CARTON 250ML NAL   11.5     11.50        3
## 3119     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 3120                Giro Chocolate Gamesa 95g   12.0      9.23        1
## 3121  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 3122     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 3123               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3124                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 3125               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 3126              Semilla Girasol Bokados 40G    8.0      6.15        1
## 3127 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 3128                            Tang Uva 15gr    5.0      3.85        1
## 3129                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3130                 Leche Lala Premium 500Ml   12.0     12.00        1
## 3131                       Cigarros Link 20pz   25.0     19.23        1
## 3132                       Rocko Marinela 50G    5.0      3.85        1
## 3133                      Paketaxo Queso 215g   36.0     27.69        1
## 3134                      Chokis Chokomax 90G   12.0      9.23        1
## 3135          Principe Marinela Chocolate 85G   13.0     10.00        2
## 3136                   Bokaditas Bokados 75Gr   10.0      7.69        1
## 3137                       Doritos Nachos 53G   12.0     12.00        1
## 3138            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 3139                    Leche Lala Premium 1L   20.0     20.00        1
## 3140                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3141                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 3142 LALA YOMI UHT CHOCOLATE CARTON 250ML NAL   11.5     11.50        2
## 3143                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3144                                 Epura 1L   10.0      7.69        1
## 3145            Massiso Chich Harina Leo 175G   27.0     20.77        1
## 3146              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 3147      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 3148                       Doritos Nachos 53G   12.0     12.00        1
## 3149                   Cheetos Torciditos 48g    8.0      8.00        1
## 3150 NUTRIOLI ACEITE PURO DE SOYA BOT PLAS 85   30.5     23.46        1
## 3151 ACT II PALOMITAS P/MICROONDAS SABOR MANT   12.0      9.23        1
## 3152                        Ruffles Queso 50G   13.0     13.00        1
## 3153              Sabritones Chile Limón 60gr   10.0      7.69        1
## 3154               Lala Deslactosada Light 1L   22.0     16.92        1
## 3155             LECHE NIDO KINDER BOLSA 114G   26.0     26.00        1
## 3156        GASA SIMPLE JALOMA 10X10 C/10 PZ.   14.0     14.00        1
## 3157              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3158           Roles De Canela Glaseados 135G   14.0     10.77        1
## 3159                     Halls Mora Azul 25gr    7.0      7.00        1
## 3160                Squirt Toronja N.R. 600Ml   13.0     10.00        1
## 3161                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 3162                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3163                      Tang Sabor Piña 15g    5.0      5.00        1
## 3164                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 3165                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 3166                         Panque Nuez 270G   30.0     30.00        1
## 3167        Mantecadas Vainilla 6 Pzas 187.5g   18.0     18.00        1
## 3168                     Coca Cola N.R. 600Ml   14.0     14.00        2
## 3169                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3170                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 3171 PALMOLIVE NATURALS SENSACION HUMECT.OLIV   14.0     10.77        1
## 3172              Conchas Bimbo Vainilla 120G   10.0      7.69        2
## 3173                          Valle Frut 2.5L   33.0     33.00        1
## 3174                       Mazapán Azteca 30G    3.0      2.31        1
## 3175 PALMOLIVE NATURALS SENSACION HUMECT.OLIV   14.0     10.77        1
## 3176                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 3177                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3178                            Pepsi N.R. 3L   34.0     34.00        1
## 3179 LALA DELICIAS PAY DE FRESA BATIDO 140GRC   16.5     16.50        1
## 3180                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 3181          Nutri Yoghurt Fresa/Cereal 450g   12.5     12.50        1
## 3182               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3183 GATORADE FIERCE BLUE THUNDER MORAS BOT P   25.0     19.23        1
## 3184                            Pepsi N.R. 3L   34.0     34.00        1
## 3185                 Chokis Choko Gamesa 84gr   12.0      9.23        1
## 3186                  Nutri Yoghurt Nuez 450g   12.5     12.50        1
## 3187                         Pepsi N.R. 600Ml   13.0     13.00        1
## 3188                        Nutri Leche 1.89L   29.0     29.00        1
## 3189                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3190                       Cigarros Link 20pz   25.0     19.23        1
## 3191                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3192                                 Epura 1L   10.0      7.69        1
## 3193              Sabritones Chile Limón 60gr   10.0      7.69        1
## 3194                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3195              GERBER DE ZANAHORIA 2E 113G   12.0     12.00        1
## 3196                            Pepsi N.R. 3L   34.0     34.00        1
## 3197                                 Epura 1L   10.0      7.69        1
## 3198                     Coca Cola N.R. 355Ml   11.0      8.46        1
## 3199                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3200                  kola Loka Gotero 3.5 gr   22.5     22.50        1
## 3201                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3202         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 3203            Fabuloso Fresca Lavanda 500Ml   17.0     13.08        1
## 3204                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3205                  Blanqueador Cloralex 1L   13.0     10.00        1
## 3206              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 3207                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3208                        Nutri Leche 1.89L   29.0     29.00        1
## 3209                           Pepsi N. R. 2L   22.0     22.00        1
## 3210                         Pepsi N.R. 400Ml    8.0      8.00        1
## 3211                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 3212                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3213                          Leche Lala 1.8L   33.0     33.00        1
## 3214                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3215      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 3216                            Tang Uva 15gr    5.0      3.85        1
## 3217               Coca Cola Retornable 500Ml   10.0     10.00        3
## 3218                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3219                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3220       Salsa Verde Cremosa Del Primo 300G   25.0     19.23        1
## 3221             Detergente Blanca Nieves 1Kg   38.5     29.62        1
## 3222                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3223                  Frutsi Sabor Uva 250 Ml    5.0      5.00        1
## 3224                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3225                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3226                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3227      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 3228              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3229                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 3230     Frutsi Sabor Ponche De Frutas 250 Ml    5.0      5.00        1
## 3231                  Cheetos Flaming Hot 48g    8.0      8.00        2
## 3232              Danonino Fresa Bebible 90gr    5.0      5.00        1
## 3233               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 3234                 Veladora Limonera Nevada   14.5     11.15        1
## 3235                     Mole Doña Maria 125G   21.0     16.15        1
## 3236                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3237                               Epura 1.5L   13.0     13.00        1
## 3238                   Cheetos Torciditos 48g    8.0      8.00        1
## 3239                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3240                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3241               Florentinas Con Cajeta 83G   12.0      9.23        1
## 3242                         Mamut Gamesa 44G    6.0      4.62        2
## 3243                     Mole Doña Maria 125G   21.0     16.15        1
## 3244                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3245                           Tang Mango 15G    5.0      5.00        1
## 3246                  MAZATUN EN ACEITE 140GR   16.5     12.69        1
## 3247                      ARROZ DIAMANTE 225G    9.0      6.92        1
## 3248              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3249               Jabon Axion Liquido 280ml.   16.5     12.69        1
## 3250         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 3251            Pure De Tomate Del Fuerte 1Kg   26.0     20.00        1
## 3252                    Crema Norteñita 250ml   20.0     15.38        1
## 3253                       Boing de Uva 500ml   11.5      8.85        1
## 3254                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3255                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3256                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3257                  Manzanita Sol N.R. 1.5L   18.0     18.00        1
## 3258            Detergente Blanca Nieves 250G   10.5      8.08        1
## 3259             Aceite Vegetal Cristal 500Ml   18.0     13.85        1
## 3260                    Leche Lala Premium 1L   20.0     20.00        1
## 3261               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3262                    Saladitas Gamesa 137G   13.0     10.00        1
## 3263              Pulpy Mango del Valle 400ml   12.0     12.00        1
## 3264                    Pulpy Del Valle 400Ml   12.0     12.00        1
## 3265                           Tang Melón 15g    5.0      5.00        1
## 3266                Ruffles Papas Con Sal 45G   13.0     13.00        1
## 3267                        Yoplait Mini 100G    5.0      5.00        2
## 3268       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 3269                        Fanta N. R. 500Ml   13.0     13.00        1
## 3270       Detergente Foca Biodegradable 250G   10.5      8.08        1
## 3271                        Ruffles Queso 50G   13.0     13.00        1
## 3272                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 3273                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 3274                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 3275             Detergente Blanca Nieves 1Kg   38.5     29.62        1
## 3276                         Pepsi N.R. 600Ml   13.0     13.00        1
## 3277                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3278                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3279        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 3280                   Tang Sabor Jamaica 15g    5.0      3.85        2
## 3281                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3282                      Tang Sabor Piña 15g    5.0      5.00        2
## 3283           Roles De Canela Glaseados 435G   30.0     23.08        1
## 3284                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3285                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3286      Axion Limon Bicarbonato Activo 250G   12.0      9.23        1
## 3287                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3288                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3289                         Pepsi N.R. 600Ml   13.0     13.00        1
## 3290            Tostadas El Gallo De Oro 250G   19.0     14.62        1
## 3291                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3292                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3293                        Coca Cola N.R. 2L   28.0     28.00        1
## 3294                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3295                               Epura 1.5L   13.0     13.00        1
## 3296                Ruffles Papas Con Sal 45G   13.0     13.00        1
## 3297                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3298                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3299                    Leche Lala Premium 1L   20.0     20.00        1
## 3300      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 3301          Nutri Yoghurt Fresa/Cereal 450g   12.5     12.50        1
## 3302              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3303  LALA YOMI UHT VAINILLA CARTON 250ML NAL   11.5     11.50        1
## 3304              Bran Frut Barra De Piña 40G    8.0      8.00        1
## 3305                     Powerade Moras 600Ml   18.0     13.85        1
## 3306                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 3307                Giro Chocolate Gamesa 95g   12.0      9.23        1
## 3308                     Cheese Puffs Leo 45G    6.0      4.62        1
## 3309                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3310            GERBER FRUTAS TROPICALES 113G   12.0     12.00        1
## 3311              Fabuloso Fresco Amanecer 1L   27.0     20.77        1
## 3312                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3313      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 3314                  Nectar Manz Jumex 250Ml    8.0      8.00        2
## 3315            Jumex Nectar De Durazno 440Ml   12.5     12.50        1
## 3316                           Flan Lala 100G    7.5      7.50        2
## 3317                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3318            Flash Xtra Brisa Marina 500Ml    9.5      7.31        1
## 3319       Detergente Foca Biodegradable 500G   21.0     16.15        1
## 3320                           Big Cola 500Ml    8.0      8.00        1
## 3321                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3322                        Consomate 8 Cubos   16.0     12.31        1
## 3323               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3324                    Saladitas Gamesa 137G   13.0     10.00        1
## 3325                            Pepsi N.R. 3L   34.0     34.00        1
## 3326                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3327                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3328                       Doritos Nachos 53G   12.0     12.00        1
## 3329                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 3330             Sabritas Papas Habanero 42 g   13.0     13.00        1
## 3331                 Leche Lala Premium 500Ml   12.0     12.00        1
## 3332                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 3333              Sopa Maruchan Carne Res 64G   12.0      9.23        2
## 3334                   Zuko Sabor Durazno 15g    5.0      5.00        1
## 3335                  Blanqueador Cloralex 1L   13.0     10.00        1
## 3336                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 3337                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3338               Coca Cola Retornable 500Ml   10.0     10.00        3
## 3339                    Leche Lala Premium 1L   20.0     20.00        1
## 3340                Mirinda Naranja N.R. 1.5L   18.0     18.00        1
## 3341              Sopa Maruchan Carne Res 64G   12.0      9.23        3
## 3342                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 3343                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3344       Jamon De Pavo Y Cerdo Chimex 162Gr   15.0     15.00        1
## 3345                    Crema Norteñita 250ml   20.0     15.38        1
## 3346                          Leche Lala 1.8L   33.0     33.00        1
## 3347       Jamon De Pavo Y Cerdo Chimex 162Gr   15.0     15.00        1
## 3348                        Powerade Frutas1L   22.0     22.00        1
## 3349                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3350                    Crema Norteñita 250ml   20.0     15.38        1
## 3351                      Gatorade Naranja 1L   25.0     25.00        1
## 3352                         Kinder Bueno 43G   21.0     16.15        1
## 3353   Veladora Limonero Supremo C/Aroma 1 Pz   14.5     11.15        1
## 3354                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 3355                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3356          Refresco De Toronja Fresca 2.5L   30.0     30.00        1
## 3357                      Tang Sabor Piña 15g    5.0      5.00        1
## 3358                Sal Refinada La Fina 500G    7.5      5.77        1
## 3359                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 3360                            Pepsi N.R. 3L   34.0     34.00        1
## 3361                       Cigarros Link 20pz   25.0     19.23        1
## 3362   FRIJOLES BAYOS REFRITOS LA SIERRA 430G   14.5     11.15        1
## 3363              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3364                    Saladitas Gamesa 137G   13.0     10.00        1
## 3365                       Doritos Nachos 53G   12.0     12.00        1
## 3366            Cepillo Colgate Premier Clean   12.0     12.00        1
## 3367                    Cacahuate Japones 55G    8.0      6.15        1
## 3368                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3369        Bubba Xtreme Paleta Pica Mix 20gr    5.0      5.00        2
## 3370                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3371               Maiz Rocero Del Campo 200g    9.0      6.92        2
## 3372          Tostadas El Gallo De Oro 50 Pza   31.0     23.85        1
## 3373                       Cigarros Link 20pz   25.0     19.23        1
## 3374                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 3375                 SERVILLETAS VELVET 125PZ   10.0      7.69        1
## 3376                        ARROZ NORVER 250G    8.5      6.54        1
## 3377                     Frutsi Manzana 250Ml    5.0      5.00        2
## 3378          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 3379  LALA YOMI UHT VAINILLA CARTON 250ML NAL   11.5     11.50        1
## 3380       Pedigree Cachorro Sobre Pollo 100g   11.0      8.46        2
## 3381                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3382                            Pepsi N.R. 3L   34.0     34.00        1
## 3383 Yoghurt Bebible Licuado Fresa Nestle 500   19.0     19.00        1
## 3384           Bubba Xtreme Fresa Paleta 17Gr    5.0      5.00        1
## 3385               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3386                     Ensueño Fresco 450Ml   13.0     10.00        1
## 3387                       Doritos Nachos 53G   12.0     12.00        1
## 3388               Coca Cola Retornable 500Ml   10.0     10.00        2
## 3389                 Nectar Mango Jumex 450Ml   12.5     12.50        1
## 3390                PERMA SHARP RASTRILLO 1PZ   10.5     10.50        1
## 3391                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3392                      Chichos Encanto 60G   10.0      7.69        2
## 3393                     Coca Cola N.R. 500Ml   13.0     13.00        4
## 3394                   Cheetos Torciditos 48g    8.0      8.00        1
## 3395                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3396                                 Epura 1L   10.0      7.69        1
## 3397                            Pepsi N.R. 3L   34.0     34.00        2
## 3398 BOKADOS TOTOPITOS MAIZ GRILL BSA 65 GR N   10.0      7.69        1
## 3399             Bran Frut Barra De Fresa 40G    8.0      8.00        2
## 3400                          Valle Frut 2.5L   33.0     33.00        1
## 3401           Froot Loops de Kellog´s 180gr.   36.0     27.69        1
## 3402                      Nutri Leche 1 Litro   16.0     12.31        1
## 3403                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3404                 Jamon Pavo Chimex 250Grs   32.0     24.62        1
## 3405                  Manzanita Sol N.R. 2.5L   27.0     20.77        1
## 3406                Mirinda Naranja N.R. 1.5L   18.0     18.00        1
## 3407                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3408                 Gelatina Dany Fresa 125G    6.5      6.50        2
## 3409                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3410                     Coca Cola N.R. 355Ml   11.0      8.46        1
## 3411                            Clamato 946Ml   34.0     26.15        1
## 3412                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3413                           Pepsi N. R. 2L   22.0     22.00        1
## 3414                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3415                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3416                Kinder Maxi Chocolate 21G    8.0      6.15        1
## 3417                Mirinda Naranja N.R. 2.5L   25.0     19.23        1
## 3418                   Fanta Naranja N.R 2.5L   30.0     23.08        1
## 3419              Bran Frut Barra De Piña 40G    8.0      8.00        1
## 3420                Queso Oaxaca Camelia 200G   29.5     29.50        1
## 3421                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3422                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3423               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3424       Detergente Foca Biodegradable 500G   21.0     16.15        1
## 3425             Valle Frut Citrus Punch 1.5L   22.0     22.00        3
## 3426                        Pepsi N. R. 500Ml   10.0     10.00        1
## 3427                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3428              Salsa Catsup Del Monte 220G   11.0      8.46        1
## 3429                        Ruffles Queso 50G   13.0     13.00        1
## 3430         Yoplait Mini Beber Durazno 100Gr    5.0      5.00        1
## 3431                           Pepsi N. R. 2L   22.0     22.00        1
## 3432                  Blanqueador Cloralex 1L   13.0     10.00        1
## 3433                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 3434           Leche Hersheys Chocolate 236Ml   11.5     11.50        1
## 3435                        Negrito Bimbo 62G   10.0     10.00        1
## 3436                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 3437                  Coca Cola Regular 355Ml    9.0      9.00        1
## 3438                           Pepsi N. R. 2L   22.0     22.00        1
## 3439                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3440                        Negrito Bimbo 62G   10.0     10.00        1
## 3441                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3442                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 3443            Detergente Blanca Nieves 250G   10.5      8.08        1
## 3444              Danonino Fresa Bebible 90gr    5.0      5.00        1
## 3445                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3446         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 3447                           Pepsi N. R. 2L   22.0     22.00        1
## 3448                         Pepsi N.R. 600Ml   13.0     13.00        1
## 3449        Salsa Chile Habanero Lol-Tun 150G   15.0     11.54        1
## 3450                     Mole Doña Maria 125G   21.0     16.15        1
## 3451                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 3452                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3453            Frijoles Bayos La Sierra 430g   16.0     12.31        1
## 3454                    Crema Norteñita 250ml   20.0     15.38        1
## 3455                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3456               Coca Cola Retornable 500Ml   10.0     10.00        2
## 3457                  Medias Noches Bimbo 8Pz   27.0     20.77        2
## 3458             Sabritones Chile Limón 165gr   25.0     19.23        1
## 3459                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 3460                        Ruffles Queso 50G   13.0     13.00        1
## 3461                       Doritos Nachos 53G   12.0     12.00        1
## 3462                    Garrafón Bonafont 19L   40.0     30.77        1
## 3463                 MANTECA VEGETAL INCA 1KG   49.0     37.69        1
## 3464                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3465                           Pepsi N. R. 2L   22.0     22.00        1
## 3466                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3467                      Detergente Ace 500G   21.0     16.15        1
## 3468                        Frutimax Limon 7g    3.5      3.50        3
## 3469                Giro Chocolate Gamesa 95g   12.0      9.23        1
## 3470                         Ace Actiblu 250G   10.5      8.08        1
## 3471                       Seven Up N.R. 1.5L   18.0     18.00        1
## 3472               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3473              Conchas Bimbo Vainilla 120G   10.0      7.69        2
## 3474        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 3475                          Valle Frut 2.5L   33.0     33.00        1
## 3476        Paketaxo Mezcladito 170g Sabritas   25.0     19.23        1
## 3477            Aceite Vegetal Kartamus 900Ml   31.5     24.23        1
## 3478                   Kinder Chocolate 12.5g    4.5      3.46        1
## 3479                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 3480                Cerveza Tecate Light 16Oz   25.0     19.23        1
## 3481          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 3482      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 3483                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 3484                               Epura 1.5L   13.0     13.00        1
## 3485                     Frutsi Manzana 250Ml    5.0      5.00        1
## 3486                  MAMILA SILICON BABY 1PZ    8.0      8.00        1
## 3487            Detergente Blanca Nieves 500G   19.5     15.00        1
## 3488              Suavitel Aroma De Sol 450Ml   15.0     11.54        1
## 3489                     Maseca Antojitos 1kg   16.0     12.31        1
## 3490              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3491                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3492      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 3493                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3494               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3495                    Saladitas Gamesa 137G   13.0     10.00        1
## 3496                    Crema Norteñita 250ml   20.0     15.38        1
## 3497                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3498                        Coca Cola N.R. 2L   28.0     28.00        1
## 3499                    Del Valle Mango 250Ml    8.0      8.00        2
## 3500               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3501                        Tang Horchata 15G    5.0      5.00        1
## 3502             Salsa Catsup Del Monte 320gr   14.0     10.77        1
## 3503                      Nutri Leche 1 Litro   16.0     12.31        1
## 3504                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 3505    ELOTE DORADO EN GRANOS DEL MONTE 400G   14.5     11.15        1
## 3506                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3507                      Nutri Leche 1 Litro   16.0     12.31        3
## 3508        Cacahuates Enchilados Bokados 45G    8.0      6.15        1
## 3509                        Ruffles Queso 50G   13.0     13.00        1
## 3510    Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        2
## 3511                  Acido Muriatico Sultana   14.0     10.77        1
## 3512                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 3513                        Ruffles Queso 50G   13.0     13.00        2
## 3514            Sabritas Crema Y Especies 45G   13.0     13.00        1
## 3515                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 3516            Sabritas Crema Y Especies 45G   13.0     13.00        1
## 3517                   Doritos Pizzerolas 47G   12.0      9.23        1
## 3518                  Blanqueador Cloralex 1L   13.0     10.00        1
## 3519              Yoghurt Cereal Colores 100G    9.5      9.50        1
## 3520                       Doritos Nachos 53G   12.0     12.00        1
## 3521                     Powerade Moras 600Ml   18.0     13.85        1
## 3522                       Cigarros Link 20pz   25.0     19.23        1
## 3523                   Tang Sabor Naranja 15g    5.0      5.00        1
## 3524                     Powerade Moras 600Ml   18.0     13.85        1
## 3525                 Pake Taxo Flaminhut 70gr   11.0      8.46        1
## 3526               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 3527                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3528                         Ace Actiblu 250G   10.5      8.08        1
## 3529                        Sprite N.R. 600Ml   14.0     14.00        1
## 3530                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3531                    Saladitas Gamesa 137G   13.0     10.00        1
## 3532                   Queso Panela Lala 200G   40.0     40.00        2
## 3533                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3534             Rodeos Picositos Encanto 30G    5.0      3.85        1
## 3535           Cheetos Torciditos Nachos 48gr    8.0      8.00        2
## 3536            VELADORA SAN JUDAS TADEO 400G   31.5     24.23        1
## 3537                Sal Yodatada La Fina 120G    7.5      5.77        1
## 3538            Fabuloso Fresca Lavanda 500Ml   17.0     13.08        1
## 3539               Arcoiris Fresa Gamesa 75gr   12.0      9.23        1
## 3540               Roles De Canela Bimbo 120G   14.0     14.00        1
## 3541                    Saladitas Gamesa 137G   13.0     10.00        1
## 3542           Froot Loops de Kellog´s 180gr.   36.0     27.69        1
## 3543        Salsa Chile Habanero Lol-Tun 150G   15.0     11.54        1
## 3544                         Ace Actiblu 250G   10.5      8.08        1
## 3545              Pan Bimbo Blanco Chico 395G   25.0     19.23        1
## 3546             Salsa Catsup Del Monte 320gr   14.0     10.77        1
## 3547                      ARROZ DIAMANTE 225G    9.0      6.92        1
## 3548                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3549                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 3550                       Doritos Nachos 53G   12.0     12.00        1
## 3551      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 3552                   Manzanita Sol N. R. 2L   18.0     13.85        1
## 3553                    Joya Manzana R. 500Ml   10.0     10.00        1
## 3554                        Pepsi N. R. 500Ml   10.0     10.00        1
## 3555             GERBER JUGO DE MANZANA 175ML   14.0     14.00        1
## 3556                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3557                    Saladitas Gamesa 137G   13.0     10.00        2
## 3558                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3559          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 3560             Salsa Catsup Del Monte 320gr   14.0     10.77        1
## 3561        Salchicha Pavo Gua Sal Tlf 500Grs   38.0     38.00        1
## 3562                  Medias Noches Bimbo 8Pz   27.0     20.77        2
## 3563           Fanta Naranja Retornable 500ml   10.0     10.00        1
## 3564          TOALLA BUENAS NOCHES S/ALAS 10P   36.0     27.69        1
## 3565                  Aqua Frut Manzana 600Ml    9.5      9.50        1
## 3566                 Speed Stick Roll On 30ml   11.5     11.50        1
## 3567                    Aqua Frut Lala Uva 1L   13.0     10.00        1
## 3568          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 3569               Queso Americano Nutrileche   14.5     14.50        1
## 3570               Coca Cola Retornable 500Ml   10.0     10.00        2
## 3571            Flan Danette Vainilla 100Grs.    7.5      7.50        1
## 3572                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3573          Nutri Yoghurt Fresa/Cereal 450g   12.5     12.50        1
## 3574           Seven Up N.R. Lima-Limon 600Ml   13.0     13.00        1
## 3575     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 3576          Principe Marinela Chocolate 85G   13.0     10.00        1
## 3577                     Coca Cola N.R. 355Ml   11.0      8.46        1
## 3578                  Nectar Manz Jumex 250Ml    8.0      8.00        1
## 3579                      Chokis Chokomax 90G   12.0      9.23        1
## 3580            Fabuloso Fresca Lavanda 500Ml   17.0     13.08        1
## 3581       Detergente Salvo Microesferas 250G   12.0      9.23        1
## 3582                        Negrito Bimbo 62G   10.0     10.00        1
## 3583                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 3584      Florentinas Fresa Y Mantequilla 83G   12.0      9.23        1
## 3585                   Jugo Valle Mango 500Ml   13.0     10.00        1
## 3586                               Epura 1.5L   13.0     13.00        1
## 3587            Massiso Chich Harina Leo 175G   27.0     20.77        1
## 3588                     Frutsi Manzana 250Ml    5.0      5.00        1
## 3589                    Leche Lala Premium 1L   20.0     20.00        1
## 3590                          Valle Frut 2.5L   33.0     33.00        1
## 3591          Principe Marinela Chocolate 85G   13.0     10.00        2
## 3592        Paketaxo Mezcladito 170g Sabritas   25.0     19.23        1
## 3593                  Coca Cola Regular 355Ml    9.0      9.00        2
## 3594                       Cigarros Link 20pz   25.0     19.23        1
## 3595                    Saladitas Gamesa 137G   13.0     10.00        2
## 3596                          Valle Frut 2.5L   33.0     33.00        1
## 3597              Sopa Maruchan Carne Res 64G   12.0      9.23        2
## 3598                  Del Valle Durazno 250Ml    8.0      6.15        2
## 3599                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 3600                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 3601                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3602                        Sprite N.R. 600Ml   14.0     14.00        1
## 3603            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 3604                     Coca Cola N.R. 355Ml   11.0      8.46        1
## 3605                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 3606                        Negrito Bimbo 62G   10.0     10.00        1
## 3607                   Churrumais Flamas 60g.    7.0      5.38        1
## 3608              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 3609                       Doritos Nachos 53G   12.0     12.00        1
## 3610                    Leche Lala Premium 1L   20.0     20.00        1
## 3611                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 3612                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3613                       Agua Mineral 355Ml    9.0      9.00        1
## 3614                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3615                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3616                    Cacahuate Japones 55G    8.0      6.15        1
## 3617               Blanqueador Cloralex 250Ml    5.0      3.85        1
## 3618                              Pinol 500Ml   15.0     11.54        1
## 3619              Semilla Girasol Bokados 40G    8.0      6.15        1
## 3620               Roles De Canela Bimbo 120G   14.0     14.00        1
## 3621              Conchas Bimbo Vainilla 120G   10.0      7.69        4
## 3622      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 3623            Jarritos Sabor Mandarina 1.5L   16.0     16.00        1
## 3624       Mayonesa Hellmann´S Con Limon 390G   27.0     20.77        1
## 3625            Frijoles Bayos La Sierra 430g   16.0     12.31        1
## 3626                            Tang Uva 15gr    5.0      3.85        1
## 3627                        Frutimax Limon 7g    3.5      3.50        1
## 3628          Charrones Picositos Encanto 30G    5.0      3.85        1
## 3629                       Doritos Nachos 53G   12.0     12.00        1
## 3630                          Rancheritos 52g   11.0     11.00        1
## 3631          Refresco De Toronja Fresca 2.5L   30.0     30.00        1
## 3632                    Crema Norteñita 250ml   20.0     15.38        1
## 3633                    Leche Lala Premium 1L   20.0     20.00        1
## 3634                            Pepsi N.R. 3L   34.0     34.00        1
## 3635                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 3636                    Queso Sierra 250G Lvi   35.0     35.00        1
## 3637                Kinder Maxi Chocolate 21G    8.0      6.15        2
## 3638      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 3639              Sopa Maruchan Carne Res 64G   12.0      9.23        1
## 3640                       Barritas Fresa 64G   10.0      7.69        1
## 3641           Submarinos Fresa Marinela 105G   12.0      9.23        1
## 3642                       Doritos Nachos 53G   12.0     12.00        1
## 3643                           Pepsi N. R. 2L   22.0     22.00        1
## 3644                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3645         Conchitas Granielote Encanto 55G   10.0      7.69        1
## 3646       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 3647               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3648                  Aqua Frut Manzana 600Ml    9.5      9.50        1
## 3649                Kinder Maxi Chocolate 21G    8.0      6.15        1
## 3650                           Pepsi N. R. 2L   22.0     22.00        1
## 3651                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3652                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3653                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3654  NESCAFE DECAF 100% ARABICA CAFE SOLUBLE   28.0     28.00        1
## 3655                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3656                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3657      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 3658                      ARROZ DIAMANTE 225G    9.0      6.92        1
## 3659        VELADORA VIRGEN DE GUADALUPE 400G   31.5     24.23        1
## 3660                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3661                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3662                      Salvo Limon 750 Ml.   38.0     29.23        1
## 3663                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3664                     Coca Cola N.R. 500Ml   13.0     13.00       11
## 3665                      Nutri Leche 1 Litro   16.0     12.31        1
## 3666            Detergente Blanca Nieves 500G   19.5     15.00        1
## 3667            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 3668       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 3669                    Powerade Frutas 600Ml   18.0     18.00        1
## 3670                        Ruffles Queso 50G   13.0     13.00        1
## 3671                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3672                      Epix  Ponche 180Ml.    8.0      8.00        1
## 3673                   Zuko Sabor Durazno 15g    5.0      5.00        1
## 3674                      Zuko Sabor Piña 15G    5.0      3.85        1
## 3675         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 3676       Detergente Salvo Microesferas 250G   12.0      9.23        1
## 3677                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3678                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 3679                       Arroz Nor Ver 900g   26.0     20.00        1
## 3680                MANTECA VEGETAL INCA 500G   28.0     21.54        1
## 3681                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3682      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 3683       Mayonesa Hellmann´S Con Limon 390G   27.0     20.77        1
## 3684               Jabon Zote Rosa Barra 100G    5.0      3.85        1
## 3685           Queso Manchego La Villita 173G   24.0     24.00        1
## 3686                         Choco Lala 500Ml   17.0     17.00        1
## 3687                     Mole Doña Maria 235G   36.5     28.08        1
## 3688       Detergente Foca Biodegradable 250G   10.5      8.08        1
## 3689              Suavitel Aroma De Sol 450Ml   15.0     11.54        1
## 3690                      Jugo Bida Uva 500Ml   10.5     10.50        1
## 3691                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3692                            Pepsi N.R. 3L   34.0     34.00        1
## 3693                    Leche Lala Premium 1L   20.0     20.00        1
## 3694                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3695                   Kinder Chocolate 12.5g    4.5      3.46        2
## 3696                           Pepsi N. R. 2L   22.0     22.00        1
## 3697            Jumex Nectar De Durazno 440Ml   12.5     12.50        1
## 3698                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3699                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3700                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 3701                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 3702                       Seven Up N.R. 1.5L   18.0     18.00        1
## 3703                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3704         FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 3705                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3706                  Lucas Muecas Chamoy 24G    7.0      7.00        1
## 3707                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 3708                           Pepsi N. R. 2L   22.0     22.00        1
## 3709                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3710                      Tang Sabor Piña 15g    5.0      5.00        2
## 3711   Limpiador Fabuloso Pasion D Frutas1 Lt   27.0     20.77        1
## 3712                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3713                    Joya Fresa N.R 600 Ml   14.0     14.00        1
## 3714           Pure De Tomate Del Fuerte 210G    6.5      5.00        1
## 3715                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3716                 Tortillas del Hogar 320g   12.0      9.23        1
## 3717            Enre-2 Spicycante Bokados 75G   10.0      7.69        1
## 3718                Kinder Maxi Chocolate 21G    8.0      6.15        1
## 3719                            Pepsi N.R. 3L   34.0     34.00        1
## 3720                     Coca Cola Zero 600Ml   14.0     14.00        1
## 3721           MARLBORO ROJO 14S FLIP-TOP BOX   47.0     36.15        1
## 3722                     Gansito Marinela 50G   10.0      7.69        2
## 3723        Cacahuates Enchilados Bokados 45G    8.0      6.15        1
## 3724                       Sangria N.R. 591Ml   14.0     10.77        1
## 3725            Enre-2 Spicycante Bokados 75G   10.0      7.69        1
## 3726                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3727                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 3728                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 3729                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 3730  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        2
## 3731            Aceite Vegetal Kartamus 900Ml   31.5     24.23        1
## 3732                       Paketaxo Queso 65G   11.0      8.46        1
## 3733        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        2
## 3734                   Manzanita Sol N. R. 2L   18.0     13.85        1
## 3735                     Powerade Moras 600Ml   18.0     13.85        1
## 3736                  Joya Manzana N.R 600 Ml   14.0     10.77        1
## 3737                   Bombonetes Navidad 55G    8.0      6.15        2
## 3738     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 3739                            Pepsi N.R. 3L   34.0     34.00        1
## 3740                                 Epura 1L   10.0      7.69        1
## 3741                    Powerade Frutas 600Ml   18.0     18.00        1
## 3742                        Powerade Moras 1L   22.0     16.92        1
## 3743                 MARLBORO GOLD 100´S 20PZ   63.0     48.46        1
## 3744               Nectar De Manzana Jumex 1L   23.0     17.69        1
## 3745       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 3746                            Pepsi N.R. 3L   34.0     34.00        1
## 3747                    Pan Molido Bimbo 210G   15.0     11.54        2
## 3748             VIVE 100% BOT PLAS 500ML NAL   15.0     11.54        1
## 3749                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 3750                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3751     Shampoo H&S Limpieza Renovadora 90ml   14.0     10.77        1
## 3752            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 3753                     Frutsi Manzana 250Ml    5.0      5.00        1
## 3754                            Pepsi N.R. 3L   34.0     34.00        1
## 3755                Ruffles Papas Con Sal 45G   13.0     13.00        1
## 3756       Mayonesa Hellmann´S Con Limon 190G   16.0     12.31        1
## 3757          Pake Taxo Sabritas Botanero 65G   11.0      8.46        2
## 3758                         Pepsi N.R. 600Ml   13.0     13.00        1
## 3759                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3760                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3761        Sabritas Papas Fritas Con Sal 45G   13.0     13.00        1
## 3762                   Cheetos Torciditos 48g    8.0      8.00        1
## 3763 FRIJOLES NEGROS REFRITOS LA COSTEÑA 580G   15.0     11.54        1
## 3764                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3765                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 3766                Kinder Maxi Chocolate 21G    8.0      6.15        1
## 3767               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3768                        Coca Cola N.R. 2L   28.0     28.00        1
## 3769                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 3770                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3771                Tix Tix Chupabarritas 12g    4.0      4.00        1
## 3772       Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 3773  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 3774        PILA PANASONIC ULTRA HYPER AA 1PZ    6.0      4.62        2
## 3775            Jumex Nectar De Durazno 440Ml   12.5     12.50        1
## 3776                   Canelitas Marinela 90G   13.0     10.00        1
## 3777                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3778            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 3779                            Pepsi N.R. 3L   34.0     34.00        1
## 3780                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3781                        Ruffles Queso 50G   13.0     13.00        2
## 3782                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3783                        Ruffles Queso 50G   13.0     13.00        1
## 3784   Queso Panela Canastita La Villita 200G   26.0     26.00        1
## 3785                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 3786                         Mamut Gamesa 44G    6.0      4.62        1
## 3787             Trident Yerbabuena 4´s 5.2gr    2.0      2.00        1
## 3788                 Queso Aderezo Virmar 1Kg   28.5     21.92        1
## 3789         Tostadas El Gallo De Oro 90pzas.   49.0     37.69        1
## 3790            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 3791               Crema Vegetal Camelia 500G   17.0     13.08        1
## 3792                        Golos Bokados 40G   10.0      7.69        1
## 3793           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 3794        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 3795             Nectar Mango Del Valle 413Ml   12.0      9.23        1
## 3796          Jamón Americano De Pavo 170 Grs   29.0     29.00        1
## 3797               Salchicha Chimex Pavo 400G   38.0     38.00        1
## 3798   Yoghurt Beber Light Fresa Yoplait 220G   11.0     11.00        1
## 3799                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3800                   Tang Sabor Naranja 15g    5.0      5.00        2
## 3801                  Manzanita Sol N.R. 2.5L   27.0     20.77        1
## 3802      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 3803            Chicharron De Cerdo Boka2 30G   10.0      7.69        1
## 3804         AZUCAR ESTANDAR 5 ESTRELLAS 900G   25.0     19.23        1
## 3805                     Coca Cola Zero 600Ml   14.0     14.00        1
## 3806                    Pan Molido Bimbo 210G   15.0     11.54        1
## 3807                  Frutsi Sabor Uva 250 Ml    5.0      5.00        2
## 3808               Jumex Fresh Citricos 600ml   12.0     12.00        1
## 3809                   Tang Sabor Naranja 15g    5.0      5.00        1
## 3810                  Lucas Muecas Pepino 24G    7.0      7.00        1
## 3811                        Ruffles Queso 50G   13.0     13.00        1
## 3812                   Gelatina Dany Uva 125G    6.5      6.50        1
## 3813                        Powerade Frutas1L   22.0     22.00        1
## 3814              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 3815                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 3816        KELLOGGS CHOCO KRISPIS CAJA 290GR   34.0     26.15        1
## 3817                    Saladitas Gamesa 137G   13.0     10.00        1
## 3818                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3819                        Powerade Moras 1L   22.0     16.92        2
## 3820         Chicharron De Cerdo Bokados 160G   47.0     36.15        1
## 3821                      Paketaxo Queso 215g   36.0     27.69        1
## 3822   Salsa Picante Clasica La Botanera 525G   11.5      8.85        1
## 3823                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3824                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 3825                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3826                         Fresca N.R. 1.5L   22.0     22.00        1
## 3827                         Pepsi N.R. 600Ml   13.0     13.00        1
## 3828      9PRINGLES EXTRA HOT PAPAS BOTE 40GR   14.0     10.77        1
## 3829                   Kinder Chocolate 12.5g    4.5      3.46        1
## 3830                PILA TIPO D PANASONIC 2PZ   25.0     25.00        1
## 3831          Refresco De Toronja Fresca 2.5L   30.0     30.00        1
## 3832                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3833                   Kinder Chocolate 12.5g    4.5      3.46        1
## 3834                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3835             VIVE 100% BOT PLAS 500ML NAL   15.0     11.54        1
## 3836                Giro Chocolate Gamesa 95g   12.0      9.23        1
## 3837                         Mamut Gamesa 44G    6.0      4.62        1
## 3838               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3839                                 Epura 1L   10.0      7.69        1
## 3840                 Pake Taxo Flaminhut 70gr   11.0      8.46        1
## 3841              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3842                   Cheetos Torciditos 48g    8.0      8.00        1
## 3843             Valle Frut Citrus Punch 1.5L   22.0     22.00        1
## 3844               Coca Cola Retornable 500Ml   10.0     10.00        1
## 3845                        Ruffles Queso 50G   13.0     13.00        1
## 3846     Frutsi Sabor Ponche De Frutas 250 Ml    5.0      5.00        1
## 3847                 Chokis Choko Gamesa 84gr   12.0      9.23        1
## 3848    Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 3849                        Negrito Bimbo 62G   10.0     10.00        1
## 3850                 NECTAR MANGO JUMEX 250ML    8.0      8.00        1
## 3851                Queso Oaxaca Camelia 200G   29.5     29.50        1
## 3852                            Pepsi N.R. 3L   34.0     34.00        1
## 3853                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 3854                  Blanqueador Cloralex 1L   13.0     10.00        1
## 3855                            Pepsi N.R. 3L   34.0     34.00        1
## 3856                  Salsa De La Viuda 150Ml   16.5     12.69        1
## 3857                       Doritos Nachos 53G   12.0     12.00        1
## 3858                 NECTAR MANGO JUMEX 250ML    8.0      8.00        1
## 3859                      Tic Tac Naranja 16G    8.0      6.15        1
## 3860                       Doritos Nachos 53G   12.0     12.00        1
## 3861        PRESTOBARBA3 MAQUINA GILLETTE 1PZ   22.0     22.00        1
## 3862                     Halls Menta 25gr 9pz    6.0      4.62        1
## 3863              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3864               Salchicha Chimex Pavo 400G   38.0     38.00        1
## 3865                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3866                 Leche Lala Premium 500Ml   12.0     12.00        1
## 3867  NESCAFE DECAF 100% ARABICA CAFE SOLUBLE   28.0     28.00        1
## 3868              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        2
## 3869         La COSTEÑA Pure de Tomate 350gr.   13.0     10.00        1
## 3870                            Clamato 296Ml   12.5     12.50        1
## 3871            VASOS DES CONVERMEX 12OZ 25PZ   14.0     10.77        1
## 3872 PLATO CHAROLA TERMICA #66 CONVERMEX C/50   14.5     11.15        1
## 3873           Seven Up N.R. Lima-Limon 600Ml   13.0     13.00        1
## 3874            Detergente Blanca Nieves 500G   19.5     15.00        1
## 3875                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3876                       GERBER MANGOS 113G   12.0     12.00        2
## 3877     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 3878                Giro Chocolate Gamesa 95g   12.0      9.23        1
## 3879                   Pan Tostado Bimbo 210G   22.0     16.92        1
## 3880                    Leche Lala Premium 1L   20.0     20.00        1
## 3881            Aceite Vegetal Kartamus 900Ml   31.5     24.23        1
## 3882                        Powerade Moras 1L   22.0     16.92        1
## 3883        PILA PANASONIC ULTRA HYPER AA 1PZ    6.0      4.62        4
## 3884                        Ruffles Queso 50G   13.0     13.00        1
## 3885                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3886                       Doritos Diablo 47G   12.0     12.00        1
## 3887            Sabritas Crema Y Especies 45G   13.0     13.00        1
## 3888                      V8 Campbell´S 340Ml   11.0     11.00        1
## 3889                       Cigarros Link 20pz   25.0     19.23        1
## 3890 Queso Crema Philladelphia Barra 190G Kft   37.0     37.00        1
## 3891        Lala Sin Lactosa Descremada 21 lt   26.0     26.00        1
## 3892                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 3893                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3894                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3895  DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        1
## 3896                        Pepsi N. R. 500Ml   10.0     10.00        1
## 3897                   Jabon Zote Blanco 100G    5.0      3.85        1
## 3898                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3899                    Joya Manzana R. 500Ml   10.0     10.00        1
## 3900                Bimbochitos vainilla 69 g   10.0     10.00        1
## 3901                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3902              Semilla Girasol Bokados 40G    8.0      6.15        1
## 3903                     Coca Cola N.R. 600Ml   14.0     14.00        2
## 3904                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3905                    Leche Lala Premium 1L   20.0     20.00        1
## 3906                     Halls Mora Azul 25gr    7.0      7.00        1
## 3907                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3908 ACT II PALOMITAS P/MICROONDAS SABOR MANT   12.0      9.23        1
## 3909                    Saladitas Gamesa 137G   13.0     10.00        1
## 3910                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3911                   Fanta Naranja N.R 2.5L   30.0     23.08        1
## 3912                    Garrafón Bonafont 19L   40.0     30.77        1
## 3913                   Pinguinos Marinela 80G   15.0     11.54        1
## 3914                    Leche Lala Premium 1L   20.0     20.00        1
## 3915                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3916              HARINA DE TRIGO SELECTA 1KG   15.0     11.54        1
## 3917  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 3918                  Blanqueador Cloralex 1L   13.0     10.00        1
## 3919       Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 3920           Queso Tipo Sierra Norteño 170G   27.5     21.15        1
## 3921                 Peñafiel Agua Mineral 2L   22.0     22.00        1
## 3922        FRIJOLES ENTEROS RANCH STYLE 425G   21.0     16.15        1
## 3923                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3924                Coca Cola Retornable 1.5L   18.0     18.00        1
## 3925             Valle Frut Citrus Punch 1.5L   22.0     22.00        1
## 3926                   Cheetos Torciditos 48g    8.0      8.00        1
## 3927             Topitos Jalapeño Bokados 65G   10.0      7.69        1
## 3928      Ruedas Bokados Cicharron Harina 30G    5.0      3.85        1
## 3929                   Pinguinos Marinela 80G   15.0     11.54        1
## 3930                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3931                            Pepsi N.R. 3L   34.0     34.00        1
## 3932                       Cigarros Link 20pz   25.0     19.23        1
## 3933                 Leche Lala Premium 500Ml   12.0     12.00        1
## 3934                     Joya Sabores R. 1.5L   18.0     13.85        1
## 3935                Jamón Americano Fud 170Gr   29.0     29.00        1
## 3936                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 3937                  Pan Bimbo Integral 405G   27.0     20.77        1
## 3938              Queso Americano Sc Lvi 175G   24.0     24.00        1
## 3939                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 3940              Bimbollos Extra Grandes 6Pz   34.0     26.15        1
## 3941      Salsa Inglesa Receta Original 145Ml   36.0     27.69        1
## 3942                Kinder Maxi Chocolate 21G    8.0      6.15        3
## 3943  B&H MENTHOL CAJETILLA SUAVE 20 CIGARROS   63.0     48.46        1
## 3944        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 3945                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 3946             Sabritas Papas Con Limon 40G   13.0     13.00        1
## 3947                       Paketaxo Queso 65G   11.0      8.46        1
## 3948                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3949                Nescafe Clásico sobre 14g   10.0      7.69        1
## 3950             Sabritas Papas Con Limon 40G   13.0     13.00        1
## 3951                       Cigarros Link 20pz   25.0     19.23        1
## 3952                   Fritos Sal Y Limón 47G    9.0      6.92        1
## 3953                           Pepsi N. R. 2L   22.0     22.00        1
## 3954                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 3955     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 3956                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 3957                            Pepsi N.R. 3L   34.0     34.00        1
## 3958                       Doritos Nachos 53G   12.0     12.00        1
## 3959                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 3960                    Joya Fresa N.R 600 Ml   14.0     14.00        1
## 3961              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 3962                           Pepsi N. R. 2L   22.0     22.00        1
## 3963                    Powerade Frutas 600Ml   18.0     18.00        1
## 3964             Cacahuate Salado Natural 80G   14.0     10.77        1
## 3965                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3966                       Cigarros Link 20pz   25.0     19.23        1
## 3967                      Aqua Frut Uva 600Ml    9.5      9.50        1
## 3968              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 3969                Ruffles Papas Con Sal 45G   13.0     13.00        1
## 3970                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3971                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 3972                         Pepsi N. R. 2.5L   27.0     27.00        1
## 3973                 Manzanita Sol N.R. 600Ml   13.0     13.00        1
## 3974                Squirt Toronja N.R. 600Ml   13.0     10.00        1
## 3975                Sal Refinada La Fina 500G    7.5      5.77        1
## 3976                        Seven Up N. R. 2L   22.0     22.00        1
## 3977                Coca Cola Retornable 2.5L   27.0     27.00        1
## 3978                       KRAZY KOLA LOKA 2G   22.5     22.50        1
## 3979         Crema Colgate Trip/Acc Blanc 50g   11.0      8.46        1
## 3980                   Pinguinos Marinela 80G   15.0     11.54        1
## 3981                   Powerade Lima-Limon 1L   22.0     22.00        1
## 3982                                 Epura 1L   10.0      7.69        1
## 3983         Pan Bimbo Multigrano Linaza 540G   38.0     29.23        1
## 3984         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 3985                          Leche Lala 1.8L   33.0     33.00        1
## 3986                    Del Valle Mango 250Ml    8.0      8.00        1
## 3987                        Sol Clamato 473Ml   30.0     23.08        2
## 3988                     Coca Cola N.R. 600Ml   14.0     14.00        2
## 3989            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 3990                         Pepsi N.R. 600Ml   13.0     13.00        1
## 3991                  Pan Bimbo Integral 720G   37.0     28.46        1
## 3992                    Leche Lala Premium 1L   20.0     20.00        1
## 3993                          Pepsi N.R. 1.5L   18.0     18.00        1
## 3994          Principe Marinela Chocolate 85G   13.0     10.00        1
## 3995                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 3996                        Sol Clamato 473Ml   30.0     23.08        1
## 3997                Gatorade Lima Limon 750Ml   20.0     20.00        1
## 3998        Mantecadas Vainilla 6 Pzas 187.5g   18.0     18.00        1
## 3999                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 4000           Lavatrastes Limon Eficaz 750ml   27.0     20.77        1
## 4001                 Jabon Zest Frescura 150g   17.0     13.08        1
## 4002                       Agua Mineral 355Ml    9.0      9.00        1
## 4003                 Leche Lala Premium 500Ml   12.0     12.00        1
## 4004            Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 4005                   Jabon Zote Blanco 200G    9.5      7.31        1
## 4006                     Boing 500ml. Manzana   11.5     11.50        1
## 4007                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 4008                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4009                         Kinder Bueno 43G   21.0     16.15        1
## 4010               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4011                    Leche Lala Premium 1L   20.0     20.00        1
## 4012                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4013                Kinder Maxi Chocolate 21G    8.0      6.15        1
## 4014          Principe Marinela Chocolate 85G   13.0     10.00        1
## 4015                    Coca Cola Zero 1.5 Lt   18.0     13.85        1
## 4016                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 4017               Garrafon Electropura 20 Lt   38.0     29.23        1
## 4018                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4019                Kinder Maxi Chocolate 21G    8.0      6.15        1
## 4020                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 4021             Aceite Vegetal Cristal 500Ml   18.0     13.85        1
## 4022           Sabrita Jalapeño Crujiente 46g   13.0     13.00        1
## 4023          Principe Marinela Chocolate 85G   13.0     10.00        1
## 4024  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 4025                       Rocko Marinela 50G    5.0      3.85        1
## 4026                         Pepsi N.R. 400Ml    8.0      8.00        1
## 4027      Naturella con Manzanilla 10 toallas   17.0     13.08        1
## 4028                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4029           MARINELA ROCKO MOBI BOLSA 45GR    5.0      3.85        1
## 4030                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4031         FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 4032                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 4033                Giro Chocolate Gamesa 95g   12.0      9.23        1
## 4034 Queso Crema Philladelphia Barra 190G Kft   37.0     37.00        1
## 4035                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4036                  Joya Manzana N.R 600 Ml   14.0     10.77        1
## 4037            Papas Fritas Leo Adobadas 40G   11.0      8.46        1
## 4038 BOKADOS TOTOPITOS MAIZ GRILL BSA 65 GR N   10.0      7.69        1
## 4039            Madalenas con Mantequilla 93g   13.0     10.00        1
## 4040                        Negrito Bimbo 62G   10.0     10.00        1
## 4041             Sabritas Papas Con Limon 40G   13.0     13.00        1
## 4042                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4043                              Epura 10.1L   31.0     23.85        1
## 4044          Fuze Tea Mango Manzanilla 600ml   13.0     13.00        1
## 4045                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4046               Garrafon Electropura 20 Lt   38.0     29.23        2
## 4047                       Cigarros Link 20pz   25.0     19.23        1
## 4048                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4049                     Sponch Marinela 120G   15.0     11.54        1
## 4050      Yoghurt Beber Durazno Yoplait 220Ml   10.0     10.00        1
## 4051                     Powerade Moras 600Ml   18.0     13.85        1
## 4052                    Del Valle Mango 250Ml    8.0      8.00        1
## 4053                          Valle Frut 2.5L   33.0     33.00        1
## 4054                            Pepsi N.R. 3L   34.0     34.00        1
## 4055                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4056                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 4057                  Joya Manzana N. R. 2.5L   30.0     30.00        1
## 4058                    Joya Manzana R. 500Ml   10.0     10.00        1
## 4059           Frijoles Ranch 260g La COSTEÑA   18.0     13.85        1
## 4060                       Rocko Marinela 50G    5.0      3.85        1
## 4061                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4062   Veladora Limonero Supremo C/Aroma 1 Pz   14.5     11.15        1
## 4063                           Flash Limon 1L   16.0     12.31        1
## 4064                           Pepsi N. R. 2L   22.0     22.00        1
## 4065               Florentinas Con Cajeta 83G   12.0      9.23        2
## 4066                         Pepsi N. R. 2.5L   27.0     27.00        3
## 4067                         Choco Lala 500Ml   17.0     17.00        1
## 4068                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4069          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 4070                        Negrito Bimbo 62G   10.0     10.00        2
## 4071                           Chip-Otles 51G   10.0      7.69        1
## 4072                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4073          Principe Marinela Chocolate 85G   13.0     10.00        1
## 4074                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 4075                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4076                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 4077                Leche Negrito Bimbo 236Ml   10.0     10.00        1
## 4078                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4079                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 4080                        Fresca N.R. 600Ml   14.0     10.77        1
## 4081                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 4082                  Yemina Codo Liso 2 200G    6.5      5.00        1
## 4083                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4084                          Bokados Mix 90G   12.0      9.23        1
## 4085                       Doritos Nachos 53G   12.0     12.00        1
## 4086           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 4087            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 4088                    Leche Lala Premium 1L   20.0     20.00        1
## 4089                   Joya Durazno N.R. 1.5L   22.0     16.92        1
## 4090              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 4091       Mantecadas Nuez Bimbo 6 Pzas 84.5g   18.0     18.00        1
## 4092          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 4093                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4094                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 4095                       Doritos Nachos 53G   12.0     12.00        1
## 4096                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4097      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 4098              Sabritas Papas Adobadas 45G   13.0     13.00        1
## 4099        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 4100             Sabritas Papas Con Limon 40G   13.0     13.00        1
## 4101                    Leche Lala Premium 1L   20.0     20.00        1
## 4102                    Tic Tac Fresa Mix 16g    8.0      6.15        1
## 4103               Garrafon Electropura 20 Lt   38.0     29.23        1
## 4104               ENSALADA DE ATÉN TUNY 135G   17.5     13.46        1
## 4105                Mirinda Naranja N.R. 1.5L   18.0     18.00        1
## 4106               Garrafon Electropura 20 Lt   38.0     29.23        1
## 4107                       Cigarros Link 20pz   25.0     19.23        1
## 4108                        Tang Horchata 15G    5.0      5.00        1
## 4109     Yoghurt De Fresa-Granola Lala 190Gr.   14.0     14.00        1
## 4110                         Flash Lavanda 1L   16.0     12.31        1
## 4111     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 4112                  Cheetos Flaming Hot 48g    8.0      8.00        2
## 4113            Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 4114                   Negrito Duo Bimbo 124g   15.0     15.00        1
## 4115                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4116                            Tang Uva 15gr    5.0      3.85        1
## 4117         AZUCAR ESTANDAR 5 ESTRELLAS 900G   25.0     19.23        1
## 4118                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4119                  Yemina Codo Liso 2 200G    6.5      5.00        2
## 4120                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4121       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 4122               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4123        Bomvaso Enchilado Chicle Bola 30G    7.0      7.00        1
## 4124                     Powerade Moras 600Ml   18.0     13.85        1
## 4125                   Powerade Lima-Limon 1L   22.0     22.00        1
## 4126                 Limoncho Sal y Limón 3gr    1.0      0.77        1
## 4127                          Coca Lata 473Ml   15.0     15.00        1
## 4128                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4129            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 4130                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4131               Blanqueador Cloralex 500Ml    8.0      6.15        1
## 4132          Ensueño Rocio de Violetas 450ml   13.0     10.00        1
## 4133                     Gansito Marinela 50G   10.0      7.69        1
## 4134             Yoghurt ChiquiTÉn Fresa 42gr    5.0      5.00        4
## 4135                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4136                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4137                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4138        Habaneras Integrales Gamesa 117Gr   11.0      8.46        2
## 4139                       Cigarros Link 20pz   25.0     19.23        1
## 4140              Bran Frut Barra De Piña 40G    8.0      8.00        1
## 4141                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 4142                Cerillos Flama 115 Piezas    5.5      5.50        1
## 4143                Mirinda Naranja N.R. 1.5L   18.0     18.00        1
## 4144            Detergente Blanca Nieves 250G   10.5      8.08        1
## 4145                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4146                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 4147                      Nutri Leche 1 Litro   16.0     12.31        1
## 4148                    Garrafón Bonafont 19L   40.0     30.77        1
## 4149                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4150            Sabritas Flamin Hot Limon 35G   13.0     13.00        1
## 4151                 Cheese Puffs Extremo 45G    6.0      4.62        1
## 4152                    Be-Light Jamaica 1.5L   18.0     13.85        1
## 4153                        Negrito Bimbo 62G   10.0     10.00        1
## 4154                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4155             Ensueño Cero Enjuague  850Ml   21.0     16.15        1
## 4156            Detergente Blanca Nieves 500G   19.5     15.00        1
## 4157   FRIJOLES BAYOS ENTEROS LA COSTEÑA 560G   16.5     12.69        1
## 4158      Danone Bipack Fresa Chocoarroz 130G   11.0     11.00        1
## 4159               Licuado Fresa Yoplait 330G   14.0     14.00        1
## 4160                     Jabon Zote Rosa 200G   10.0      7.69        1
## 4161                  Blanqueador Cloralex 1L   13.0     10.00        1
## 4162                 Flash Xtra Lavanda 500Ml    9.5      7.31        1
## 4163                   Jabon Zote Blanco 200G    9.5      7.31        1
## 4164              ABSORSEC TOALLA HUMEDA 70PZ   21.5     21.50        1
## 4165 SAVILE COLAGENO PULPA SABILA ANTIESPONJA   10.5     10.50        1
## 4166            VELADORA SAN JUDAS TADEO 400G   31.5     24.23        1
## 4167               Roles De Canela Bimbo 120G   14.0     14.00        1
## 4168                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4169             Pan Tostado Doble Fibra 250G   24.0     18.46        1
## 4170                    Leche Lala Premium 1L   20.0     20.00        1
## 4171                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4172                          Zuko Sandía 15g    5.0      5.00        1
## 4173              Sabritones Chile Limón 60gr   10.0      7.69        1
## 4174           Clamato Vuelve A La Vida 473Ml   20.5     20.50        1
## 4175                   Joya Durazno N.R. 1.5L   22.0     16.92        1
## 4176                   Joya Durazno N.R. 1.5L   22.0     16.92        1
## 4177                    Leche Lala Premium 1L   20.0     20.00        1
## 4178                 Leche Lala Premium 500Ml   12.0     12.00        1
## 4179                Nescafe Clásico sobre 14g   10.0      7.69        1
## 4180                        Pepsi N. R. 500Ml   10.0     10.00        1
## 4181               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4182                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4183                        Nutri Leche 1.89L   29.0     29.00        1
## 4184  DANUP COOKIES & CREAM P/BEBER 350GR NAL   14.0     14.00        1
## 4185                      Nutri Leche 1 Litro   16.0     12.31        1
## 4186               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4187                    Halls Cereza 25gr 9pz    6.0      4.62        1
## 4188                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 4189               Jumex Fresh Conga 2 Litros   21.0     21.00        1
## 4190                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4191                   Jugo Valle Mango 500Ml   13.0     10.00        1
## 4192                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4193                 SERVILLETAS VELVET 125PZ   10.0      7.69        1
## 4194                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 4195      Lechita Santa Clara Chocolate 200ml    9.5      9.50        1
## 4196                        Powerade Frutas1L   22.0     22.00        1
## 4197           Nectar Manzana Del Valle 413Ml   12.0     12.00        1
## 4198               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4199                           Joya Uva 600Ml   14.0     10.77        1
## 4200               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4201               ENSALADA DE ATÉN TUNY 135G   17.5     13.46        2
## 4202                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4203                                 Epura 1L   10.0      7.69        1
## 4204                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4205                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4206                   Kinder Chocolate 12.5g    4.5      3.46        3
## 4207       Detergente Foca Biodegradable 500G   21.0     16.15        1
## 4208       Detergente Foca Biodegradable 250G   10.5      8.08        1
## 4209                   Churrumais Flamas 60g.    7.0      5.38        1
## 4210                      Nutri Leche 1 Litro   16.0     12.31        2
## 4211                      Chokis Chokomax 90G   12.0      9.23        1
## 4212                     Gatorade Limonada 1L   25.0     25.00        1
## 4213                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4214                 Mole Rogelio Bueno, 125g   21.0     16.15        1
## 4215               Jabon Zote Rosa Barra 100G    5.0      3.85        1
## 4216                Cerveza Tecate Light 16Oz   20.0     15.38        1
## 4217                        ARROZ NORVER 250G    8.5      6.54        1
## 4218              Conchas Bimbo Vainilla 120G   10.0      7.69        1
## 4219                       Agua Mineral 355Ml    9.0      9.00        1
## 4220               Garrafon Electropura 20 Lt   38.0     29.23        1
## 4221                          Valle Frut 2.5L   33.0     33.00        1
## 4222            Jumex Nectar De Durazno 440Ml   12.5     12.50        1
## 4223                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4224      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 4225                           Pepsi N. R. 2L   22.0     22.00        1
## 4226               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4227                Cerveza Tecate Light 16Oz   25.0     19.23        2
## 4228                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4229                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4230                 Veladora Limonera Nevada   14.5     11.15        2
## 4231                 Kinder Sorpresa Niña 20g   21.0     16.15        1
## 4232                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4233             Fideos Knorr Chile Limon 95g   13.0     10.00        1
## 4234                Cerveza Tecate Light 16Oz   20.0     15.38        2
## 4235                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4236      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 4237                         Pepsi N.R. 600Ml   13.0     13.00        1
## 4238                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4239                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4240                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4241                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4242                            Pepsi N.R. 3L   34.0     34.00        1
## 4243               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 4244               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4245             Crema Acidificada Lala 200Ml   15.5     15.50        2
## 4246      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 4247                     Tostileo Extreme 75G   10.0      7.69        1
## 4248        Papirringas Leo A La Francesa 40G   10.0      7.69        1
## 4249                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4250               Arcoiris Fresa Gamesa 75gr   12.0      9.23        1
## 4251                     Powerade Moras 600Ml   18.0     13.85        1
## 4252                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 4253                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 4254             Nectar Mango Del Valle 413Ml   12.0      9.23        1
## 4255            Crujitos Queso Con Chile 43Gr   11.0     11.00        1
## 4256                 Pake Taxo Flaminhut 70gr   11.0      8.46        1
## 4257       CHIPOTLES ADOBADOS LA COSTEÑA 105G   11.5      8.85        1
## 4258                  Del Valle Durazno 250Ml    8.0      6.15        1
## 4259        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 4260            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 4261                  Del Valle Durazno 500Ml   13.0     13.00        4
## 4262                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4263                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4264                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4265                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4266                          Zuko Sandía 15g    5.0      5.00        1
## 4267      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4268                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4269               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4270                 SERVILLETAS VELVET 125PZ   10.0      7.69        1
## 4271            VASOS DES CONVERMEX 12OZ 25PZ   14.0     10.77        1
## 4272                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 4273                     Coca Cola N. R. 2.5L   34.0     34.00        2
## 4274                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 4275                  Topitos 360 Bokados 60G   10.0      7.69        1
## 4276                   Joya Durazno N.R. 1.5L   22.0     16.92        1
## 4277                         Mamut Gamesa 44G    6.0      4.62        1
## 4278                       Cigarros Link 20pz   25.0     19.23        1
## 4279          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 4280            Madalenas con Mantequilla 93g   13.0     10.00        1
## 4281        Pinol Microcapsulas Lavanda 828Ml   21.5     16.54        1
## 4282                    Crema Norteñita 250ml   20.0     15.38        1
## 4283 Limpiador Liquido Bref Frscura Intens 1L   24.0     18.46        1
## 4284                     Gansito Marinela 50G   10.0      7.69        2
## 4285                      Chichos Encanto 60G   10.0      7.69        1
## 4286                       Doritos Nachos 53G   12.0     12.00        1
## 4287                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4288                   Churrumais Flamas 60g.    7.0      5.38        1
## 4289    Papel Hig Color 360Hojas Dobles 4Pzas   22.0     16.92        1
## 4290             Clamato estilo cubano 473 ml   20.5     20.50        1
## 4291                  Agua Mineral N. R. 1.5L   23.0     23.00        1
## 4292                         Pepsi N. R. 2.5L   27.0     27.00        2
## 4293                    Joya Manzana R. 500Ml   10.0     10.00        1
## 4294                 CHAROLA 855 PIC NIC 50PZ   22.0     16.92        1
## 4295             Detergente Blanca Nieves 1Kg   38.5     29.62        1
## 4296                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4297                        Nutri Leche 1.89L   29.0     29.00        1
## 4298                           Pepsi N. R. 2L   22.0     22.00        1
## 4299                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4300                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4301                    Conchitas Encanto 60G   10.0      7.69        1
## 4302                  Topitos 360 Bokados 60G   10.0      7.69        1
## 4303                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4304      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4305                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 4306      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4307                   Zuko Sabor Manzana 15G    5.0      5.00        2
## 4308                    Pulpy Del Valle 400Ml   12.0     12.00        1
## 4309                  Del Valle Durazno 250Ml    8.0      6.15        2
## 4310                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4311                       Cigarros Link 20pz   25.0     19.23        1
## 4312                 Tostitos Flaming Hot 70G   11.0      8.46        2
## 4313                            Clamato 296Ml   12.5     12.50        1
## 4314             Salsa Catsup Del Monte 320gr   14.0     10.77        1
## 4315                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4316        Pake-Taxo Sabritas Mezcladito 68G   11.0      8.46        1
## 4317                        Powerade Moras 1L   22.0     16.92        1
## 4318                       Doritos Nachos 53G   12.0     12.00        1
## 4319                     Sal De Uvas Picot 5G    3.5      3.50        2
## 4320                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 4321       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        1
## 4322                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 4323                Cerveza Tecate Light 16Oz   20.0     15.38       25
## 4324            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 4325                               Epura 1.5L   13.0     13.00        1
## 4326                   Pinguinos Marinela 80G   15.0     11.54        1
## 4327          Chicharron De Cerdo Bokados 70G   18.0     13.85        1
## 4328                         Pepsi N.R. 400Ml    8.0      8.00        1
## 4329                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4330                    Cacahuate Japones 55G    8.0      6.15        1
## 4331            Massiso Chich Harina Leo 175G   27.0     20.77        1
## 4332                        Ruffles Queso 50G   13.0     13.00        2
## 4333                       Doritos Nachos 53G   12.0     12.00        2
## 4334                           Pepsi N. R. 2L   22.0     22.00        1
## 4335     BOKADOS TOPITOS PIZZA BOLSA 65GR NAL   10.0      7.69        1
## 4336                          Rancheritos 52g   11.0     11.00        1
## 4337                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4338                    Epura Purificada 2Lts   14.0     10.77        1
## 4339                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4340                   Tang Sabor Naranja 15g    5.0      5.00        1
## 4341     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 4342                       Cigarros Link 20pz   25.0     19.23        1
## 4343                 Tostaditas Maizalgo 400g   28.0     21.54        1
## 4344       Detergente Foca Biodegradable 250G   10.5      8.08        1
## 4345                     Ensueño Fresco 450Ml   13.0     10.00        1
## 4346                         Pepsi N.R. 400Ml    8.0      8.00        1
## 4347                  Gelatina Dany Piña 125G    6.5      6.50        1
## 4348                      Nutri Leche 1 Litro   16.0     12.31        1
## 4349                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4350                      Tang Sabor Piña 15g    5.0      5.00        1
## 4351                    Yoplait Mini Uva 100G    5.0      5.00        1
## 4352                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4353                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4354                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 4355                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4356                 Gelatina Dany Fresa 125G    6.5      6.50        2
## 4357                    Saladitas Gamesa 137G   13.0     10.00        1
## 4358          Danonino Maxi Fresa Danone 170G    8.0      8.00        1
## 4359  DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        1
## 4360               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 4361                 Cheese Puffs Extremo 45G    6.0      4.62        1
## 4362                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4363                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4364                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 4365                            Pepsi N.R. 3L   34.0     34.00        1
## 4366                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 4367        RAJAS DE Jalapeño LA COSTEÑA 105G    7.0      5.38        1
## 4368                   Tang Sabor Jamaica 15g    5.0      3.85        1
## 4369          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 4370                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 4371            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 4372                 Pake Taxo Flaminhut 70gr   11.0      8.46        1
## 4373                          Bokados Mix 90G   12.0      9.23        1
## 4374       Sopa De Fideos Con Pollo Knorr 95G   13.0     10.00        1
## 4375                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 4376            KOTEX MANZANILLA CON ALAS 10P   17.0     13.08        1
## 4377                   Kinder Chocolate 12.5g    4.5      3.46        2
## 4378              Fritura De Maiz Bogo´S 125G   14.0     10.77        1
## 4379                         Kinder Bueno 43G   21.0     16.15        1
## 4380           Clamato Vuelve A La Vida 473Ml   20.5     20.50        1
## 4381                        Powerade Frutas1L   22.0     22.00        1
## 4382                          Bokados Mix 90G   12.0      9.23        1
## 4383 LALA DELICIAS PAY DE FRESA BATIDO 140GRC   16.5     16.50        1
## 4384                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4385                Cerveza Tecate Light 16Oz   20.0     15.38        1
## 4386                  Del Valle Durazno 250Ml    8.0      6.15        1
## 4387                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 4388            Tostadas El Gallo De Oro 250G   19.0     14.62        1
## 4389                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4390                         Mamut Gamesa 44G    6.0      4.62        1
## 4391                 Calahua Crema De Coco 1L   60.0     60.00        1
## 4392                      Chichos Encanto 60G   10.0      7.69        1
## 4393                         Pepsi N.R. 600Ml   13.0     13.00        1
## 4394            Enre-2 Spicycante Bokados 75G   10.0      7.69        1
## 4395                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4396                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4397                          Squirt N. R. 2L   22.0     16.92        1
## 4398                            Pepsi N.R. 3L   34.0     34.00        1
## 4399                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 4400              Chicharrón De Cerdo Leo 30G   12.0      9.23        1
## 4401                Squirt Toronja 2.5 Litros   25.0     25.00        1
## 4402 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 4403                        Ruffles Queso 50G   13.0     13.00        1
## 4404                Leche Negrito Bimbo 236Ml   10.0     10.00        1
## 4405                    Powerade Frutas 600Ml   18.0     18.00        1
## 4406                   Churrumais Flamas 60g.    7.0      5.38        1
## 4407                  Nutri Yoghurt Nuez 450g   12.5     12.50        1
## 4408                  Joya Manzana N. R. 2.5L   30.0     30.00        1
## 4409                  Cheetos Flaming Hot 48g    8.0      8.00        2
## 4410 Mr. Musculo Desengrasante Naranja Trigge   43.0     33.08        1
## 4411                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 4412                               Epura 1.5L   13.0     13.00        1
## 4413                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4414                Crema Vegetal Camelia 1Kg   27.0     20.77        1
## 4415                       Doritos Diablo 47G   12.0     12.00        1
## 4416                       Doritos Nachos 53G   12.0     12.00        1
## 4417                  Aqua Frut Naranja 600Ml    9.5      9.50        1
## 4418                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 4419                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4420                     Tostileo Extreme 75G   10.0      7.69        1
## 4421                        Ruffles Queso 50G   13.0     13.00        1
## 4422        Lala Sin Lactosa Descremada 21 lt   26.0     26.00        2
## 4423       Jamon De Pavo Virginia Fud 250 Grs   55.0     42.31        1
## 4424                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4425       Detergente Salvo Microesferas 250G   12.0      9.23        1
## 4426                     Jabon Zote Rosa 400G   19.5     15.00        1
## 4427                  Senzo Mix Chocolate 93G   12.0      9.23        1
## 4428            Frutzzo Jumex Naranjada 600ml   13.0     10.00        1
## 4429      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4430                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4431                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4432                 SERVILLETAS VELVET 125PZ   10.0      7.69        1
## 4433           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 4434          Pake Taxo Sabritas Botanero 65G   11.0      8.46        1
## 4435                          Rancheritos 52g   11.0     11.00        1
## 4436   Salsa Picante Clasica La Botanera 525G   11.5      8.85        1
## 4437            Frijoles Bayos La Sierra 430g   16.0     12.31        1
## 4438             Cacahuate Salado Bokados 90G   12.0      9.23        1
## 4439                   Jugo Bida Fresa 500 Ml   10.5      8.08        1
## 4440                        Ruffles Queso 50G   13.0     13.00        1
## 4441                   Cheetos Torciditos 48g    8.0      8.00        1
## 4442                  Cheetos Flaming Hot 48g    8.0      8.00        2
## 4443                        Coca Cola N.R. 2L   28.0     28.00        1
## 4444                          Squirt N. R. 2L   22.0     16.92        1
## 4445                      Gel EGO black 250ml   18.5     18.50        1
## 4446                       Paketaxo Queso 65G   11.0      8.46        1
## 4447                        Pepsi N. R. 500Ml   10.0     10.00        1
## 4448                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4449                  Lucas Muecas Pepino 24G    7.0      7.00        1
## 4450                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4451                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4452                Squirt Toronja 2.5 Litros   25.0     25.00        1
## 4453                     Boing 500ml. Manzana   11.5     11.50        1
## 4454                       Paketaxo Queso 65G   11.0      8.46        1
## 4455                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4456          Refresco De Toronja Fresca 2.5L   30.0     30.00        1
## 4457                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4458                   Lucas Muecas Mango 24G    7.0      7.00        1
## 4459                      Epix  Ponche 180Ml.    8.0      8.00        1
## 4460                          Zuko Sandía 15g    5.0      5.00        1
## 4461                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4462                       Doritos Nachos 53G   12.0     12.00        1
## 4463       Mayonesa Hellmann´S Con Limon 190G   16.0     12.31        1
## 4464                      Rebanadas Bimbo 2Pz    5.0      5.00        2
## 4465                   Kinder Chocolate 12.5g    4.5      3.46        1
## 4466           Bubba Xtreme Fresa Paleta 17Gr    5.0      5.00        1
## 4467                Sal Refinada La Fina 500G    7.5      5.77        1
## 4468            Detergente Blanca Nieves 250G   10.5      8.08        1
## 4469                           Pepsi N. R. 2L   22.0     22.00        1
## 4470                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4471                 Coca Cola Light R. 500Ml   10.0      7.69        1
## 4472                    Joya Fresa N.R 600 Ml   14.0     14.00        1
## 4473                       Doritos Nachos 53G   12.0     12.00        1
## 4474              Salsa Catsup Del Monte 220G   11.0      8.46        1
## 4475                       Cigarros Link 20pz   25.0     19.23        1
## 4476                       Seven Up N.R. 1.5L   18.0     18.00        1
## 4477                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4478                Cerveza Tecate Light 16Oz   20.0     15.38        3
## 4479                           Tang Melón 15g    5.0      5.00        1
## 4480            Doritos Flaming Hot Limon 46G   12.0     12.00        1
## 4481                          Bimbuñuelos 99g   14.0     10.77        1
## 4482                            Pepsi N.R. 3L   34.0     34.00        1
## 4483                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4484   Salsa Picante Clasica La Botanera 525G   11.5      8.85        1
## 4485                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4486  Papel Higienico Jumbo 455hojas Rollos 4   26.0     20.00        1
## 4487                     Coca Cola Zero 600Ml   14.0     14.00        1
## 4488                           Tang Mango 15G    5.0      5.00        1
## 4489      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4490                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4491                Crema Vegetal Camelia 1Kg   27.0     20.77        1
## 4492                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4493                Cerveza Tecate Light 16Oz   20.0     15.38        6
## 4494         Tostadas El Gallo De Oro 90pzas.   49.0     37.69        1
## 4495           Nectar Manzana Del Valle 250Ml    8.0      8.00        1
## 4496                        Sol Clamato 473Ml   25.0     19.23        1
## 4497                Sal Refinada La Fina 500G    7.5      5.77        1
## 4498      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4499                        Pepsi N. R. 500Ml   10.0     10.00        1
## 4500         La COSTEÑA Pure de Tomate 350gr.   13.0     10.00        1
## 4501            Sabritas Crema Y Especies 45G   13.0     13.00        1
## 4502                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 4503                          Rancheritos 52g   11.0     11.00        1
## 4504                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4505              Bimbollos Extra Grandes 6Pz   34.0     26.15        1
## 4506               Coca Cola Retornable 500Ml   10.0     10.00        3
## 4507            Totopos Para Chilaquiles 280G   23.0     17.69        1
## 4508                   Joya Ponche N. R. 2.5L   30.0     23.08        1
## 4509                      Nutri Leche 1 Litro   16.0     12.31        1
## 4510      Danone Bipack Fresa Chocoarroz 130G   11.0     11.00        1
## 4511                        Frutimax Mango 7g    3.5      3.50        1
## 4512                 ATÉn El Dorado Agua 140g   13.5     10.38        3
## 4513                        Coca Cola N.R. 2L   28.0     28.00        1
## 4514                  Yoghurt Fresa Lala 440G   16.5     16.50        2
## 4515                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4516                         Pepsi N.R. 600Ml   13.0     13.00        1
## 4517               Jabon Zote Rosa Barra 100G    5.0      3.85        1
## 4518                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4519                Cerveza Tecate Light 16Oz   20.0     15.38        2
## 4520            Cacahuate Japones Encanto 50G    8.0      6.15        1
## 4521                        Ruffles Queso 50G   13.0     13.00        1
## 4522                 Tostitos Salsa Verde 72G   11.0      8.46        1
## 4523                                 Epura 1L   10.0      7.69        1
## 4524                        Powerade Frutas1L   22.0     22.00        1
## 4525       CHIPOTLES ADOBADOS LA COSTEÑA 105G   11.5      8.85        1
## 4526                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4527      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4528     Sazonador Zona Limon Y Pimienta 160G   30.0     23.08        1
## 4529                    Saladitas Gamesa 137G   13.0     10.00        1
## 4530            Enre-2 Spicycante Bokados 75G   10.0      7.69        1
## 4531 NUTRIOLI ACEITE PURO DE SOYA BOT PLAS 85   30.5     23.46        1
## 4532                Sal Refinada La Fina 500G    7.5      5.77        1
## 4533                            Pepsi N.R. 3L   34.0     34.00        1
## 4534                      Tic Tac Naranja 16G    8.0      6.15        1
## 4535                      ARROZ DIAMANTE 225G    9.0      6.92        1
## 4536       Sabritas Flaming Hot Rec Cruj 46gr   13.0     13.00        1
## 4537                 NECTAR MANGO JUMEX 250ML    8.0      8.00        1
## 4538                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 4539               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4540                     Sal De Uvas Picot 5G    3.5      3.50        1
## 4541                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4542              Ensueño Bebe con Aloe 450ml   13.0     10.00        1
## 4543                         Ace Actiblu 250G   10.5      8.08        1
## 4544                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 4545        RAJAS DE Jalapeño LA COSTEÑA 105G    7.0      5.38        1
## 4546       Mayonesa Hellmann´S Con Limon 190G   16.0     12.31        1
## 4547  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 4548                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 4549            Valle Frut Citrus Punch 600Ml   12.0     12.00        1
## 4550                     Coca Cola N.R. 355Ml   11.0      8.46        1
## 4551                       Doritos Nachos 53G   12.0     12.00        1
## 4552   MITADES DURAZNOS CLEMENTE JACQUES 820G   55.0     42.31        1
## 4553                        Powerade Frutas1L   22.0     22.00        2
## 4554                        Frutimax Mango 7g    3.5      3.50        1
## 4555                  Starkis Extremo Leo 30G    5.0      3.85        1
## 4556              Prispas Habaneras Boka2 50G   10.0      7.69        1
## 4557             Topitos Jalapeño Bokados 65G   10.0      7.69        1
## 4558                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4559     Frutsi Sabor Ponche De Frutas 250 Ml    5.0      5.00        1
## 4560                    Saladitas Gamesa 137G   13.0     10.00        1
## 4561                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4562                         Pepsi N.R. 400Ml    8.0      8.00        1
## 4563                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4564  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 4565           Suavitel Fresca Primav. 800ml.   26.5     20.38        1
## 4566                    Flash Brisa Marina 1L   16.0     12.31        1
## 4567                       Doritos Nachos 53G   12.0     12.00        1
## 4568                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4569                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4570       Pedigree Cachorro Sobre Pollo 100g   11.0      8.46        2
## 4571       Jamon De Pavo Y Cerdo Chimex 162Gr   15.0     15.00        1
## 4572                    Pulpy Del Valle 400Ml   12.0     12.00        1
## 4573                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4574                     Detergente Roma 250G   10.0      7.69        1
## 4575                MANTECA VEGETAL INCA 500G   28.0     21.54        1
## 4576               Coca Cola Retornable 500Ml   10.0     10.00        6
## 4577                  Pan Bimbo Integral 720G   37.0     28.46        1
## 4578                          Leche Lala 1.8L   33.0     33.00        1
## 4579                           Pepsi N. R. 2L   22.0     22.00        1
## 4580                        Sol Clamato 473Ml   25.0     19.23        2
## 4581                            Tang Uva 15gr    5.0      3.85        1
## 4582                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4583                    Saladitas Gamesa 137G   13.0     10.00        1
## 4584                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4585                            Pepsi N.R. 3L   34.0     34.00        1
## 4586                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4587                    Crema Norteñita 250ml   20.0     15.38        1
## 4588                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 4589 CHILES SERRANOS ESCABECHE LA COSTEÑA105G    7.0      5.38        1
## 4590                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4591             Salsa Catsup Del Monte 320gr   14.0     10.77        1
## 4592                      Aqua Frut Uva 600Ml    9.5      9.50        1
## 4593             COLORANTE FIJO CABALLITO 18G   14.5     11.15        1
## 4594                    Saladitas Gamesa 137G   13.0     10.00        1
## 4595                     Halls Menta 25gr 9pz    6.0      4.62        1
## 4596                 Chokis Choko Gamesa 84gr   12.0      9.23        2
## 4597          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 4598            DANUP P/BEBER FRESA 220GR NAL   11.5     11.50        1
## 4599                          Pepsi N.R. 1.5L   18.0     18.00        2
## 4600                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4601                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4602                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 4603              Queso Americano Sc Lvi 175G   24.0     24.00        1
## 4604                 Nectar Mango Jumex 450Ml   12.5     12.50        1
## 4605     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 4606                    Bubulubu Ricolino 35G    8.0      6.15        1
## 4607                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4608          Jugo De Durazno Del Valle 413Ml   12.0     12.00        1
## 4609                        Panque Pasas 285G   30.0     23.08        1
## 4610   Veladora Limonero Supremo C/Aroma 1 Pz   14.5     11.15        3
## 4611               Blanqueador Cloralex 500Ml    8.0      6.15        1
## 4612          Prispas A La Francesa Boka2 50G   10.0      7.69        1
## 4613                           Pepsi N. R. 2L   22.0     22.00        1
## 4614                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4615                     Jabon Zote Rosa 400G   19.5     15.00        1
## 4616       Churritos Leo Frituras De Maíz 60G   10.0      7.69        1
## 4617                  Gelatina Dany Piña 125G    6.5      6.50        1
## 4618               Cacahuate Japones Leo 100G   12.0      9.23        1
## 4619                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4620           Bubba Xtreme Fresa Paleta 17Gr    5.0      5.00        1
## 4621       CHIPOTLES ADOBADOS LA COSTEÑA 105G   11.5      8.85        2
## 4622              Pan Bimbo Blanco Chico 395G   25.0     19.23        1
## 4623                   Joya Durazno N.R. 1.5L   22.0     16.92        1
## 4624                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4625                Kinder Maxi Chocolate 21G    8.0      6.15        1
## 4626                     Boing de Mango 500ml   11.5      8.85        1
## 4627                            Pepsi N.R. 3L   34.0     34.00        1
## 4628                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4629     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 4630                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4631               Garrafon Electropura 20 Lt   38.0     29.23        1
## 4632                       Axion Limon 400 Ml   20.5     15.77        1
## 4633 ACT II PALOMITAS P/MICROONDAS EXTRA MANT   12.0      9.23        1
## 4634                 Jamon Pavo Chimex 250Grs   32.0     24.62        1
## 4635                         Pepsi N.R. 400Ml    8.0      8.00        1
## 4636                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 4637                        Fresca N.R. 600Ml   14.0     10.77        1
## 4638               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 4639                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4640  DANONE DANONINO FRESA SOLIDO POUCH 70GR   11.0     11.00        2
## 4641                        Negrito Bimbo 62G   10.0     10.00        1
## 4642                       KRAZY KOLA LOKA 2G   22.5     22.50        1
## 4643         Yoplait Mini Batido Fresa 2/45Gr    5.0      5.00        1
## 4644              Pall Mall Ibiza Sunzet 20'S   56.0     43.08        1
## 4645               ENSALADA DE ATÉN TUNY 135G   17.5     13.46        1
## 4646                            Pepsi N.R. 3L   34.0     34.00        1
## 4647                 SERVILLETAS VELVET 125PZ   10.0      7.69        1
## 4648                        Tang Horchata 15G    5.0      5.00        2
## 4649                Cerveza Tecate Light 16Oz   20.0     15.38       12
## 4650               Garrafon Electropura 20 Lt   38.0     29.23        1
## 4651                   Salchicha de Pavo 266g   22.0     22.00        1
## 4652              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        2
## 4653            Massiso Chich Harina Leo 175G   27.0     20.77        1
## 4654                       Doritos Nachos 53G   12.0     12.00        1
## 4655                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 4656                            Pepsi N.R. 3L   34.0     34.00        1
## 4657                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 4658               Downy Libre Enjuague 850Ml   27.5     21.15        1
## 4659                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4660                       Cigarros Link 20pz   25.0     19.23        1
## 4661                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4662           Fabuloso Fresco Amanecer 500Ml   17.0     13.08        1
## 4663          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 4664                   Cheetos Torciditos 48g    8.0      8.00        1
## 4665                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4666                       Seven Up N.R. 1.5L   18.0     18.00        1
## 4667                     Gatorade Limon 600Ml   20.0     20.00        1
## 4668                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4669                                 Epura 1L   10.0      7.69        1
## 4670                     Salsa Valentina 370M   13.0     10.00        1
## 4671                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4672             LECHE NIDO KINDER BOLSA 114G   26.0     26.00        1
## 4673                       Pepsi Light 1.5 Lt   18.0     13.85        1
## 4674                 Tostitos Flaming Hot 70G   11.0      8.46        1
## 4675 T Femenina Princess Nocturna C/Alas 8Pza   25.5     19.62        1
## 4676                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4677                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4678              Corn Pops De Kellogg'S 210G   39.0     30.00        1
## 4679                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4680                    Leche Lala Premium 1L   20.0     20.00        1
## 4681              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 4682                      Be-Light Limon 1.5L   17.0     13.08        1
## 4683            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 4684                       Boing de Uva 500ml   11.5      8.85        1
## 4685              Pulpy Mango del Valle 400ml   12.0     12.00        1
## 4686         Tostadas El Gallo De Oro 90pzas.   49.0     37.69        1
## 4687         FRIJOL REFRITO BAYO ISADORA 430G   19.0     14.62        1
## 4688                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4689                Kinder Maxi Chocolate 21G    8.0      6.15        2
## 4690                       Doritos Nachos 53G   12.0     12.00        1
## 4691                        Yoplait Mini 100G    5.0      5.00        1
## 4692           Nectar Manzana Del Valle 250Ml    8.0      8.00        2
## 4693                   Cheetos Torciditos 48g    8.0      8.00        1
## 4694                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4695                Cerveza Tecate Light 16Oz   20.0     15.38        1
## 4696                  Yoghurt Fresa Lala 440G   16.5     16.50        1
## 4697           Roles De Canela Glaseados 135G   14.0     10.77        1
## 4698                     Coca Cola N.R. 355Ml   11.0      8.46        1
## 4699               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4700       Mayonesa Hellmann´S Con Limon 105G   12.5      9.62        1
## 4701                   Tang Sabor Jamaica 15g    5.0      3.85        1
## 4702                           Tang Mango 15G    5.0      5.00        1
## 4703                    Crema Norteñita 250ml   20.0     15.38        1
## 4704              M&M Chocolate Display 47.9G   15.0     11.54        1
## 4705             Sabritas Papas Con Limon 40G   13.0     13.00        1
## 4706                 Manzanita Sol N.R. 600Ml   13.0     13.00        1
## 4707                         Pepsi N.R. 600Ml   13.0     13.00        1
## 4708               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4709     Yoghurt De Fresa-Granola Lala 190Gr.   14.0     14.00        1
## 4710                    Knorr Suiza Pollo 2Pz    5.0      3.85        1
## 4711                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4712                Cerveza Tecate Light 16Oz   20.0     15.38        4
## 4713                        Ruffles Queso 50G   13.0     13.00        1
## 4714                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4715          Tostadas El Gallo De Oro 50 Pza   31.0     23.85        1
## 4716                  Sopa Maruchan Queso 64G   11.5      8.85        2
## 4717  FRIJOLES BAYOS REFRITOS LA COSTEÑA 440G   14.0     10.77        1
## 4718           Queso Tipo Sierra Norteño 170G   27.5     21.15        1
## 4719                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4720       Sopa Maruchan Camaron Habanero 64G   12.0      9.23        2
## 4721                  BEBIN SUPER GRANDE 14PZ   45.0     34.62        1
## 4722                     Mole Doña Maria 125G   21.0     16.15        1
## 4723                   Tang Sabor Naranja 15g    5.0      5.00        1
## 4724         AZUCAR ESTANDAR 5 ESTRELLAS 500G   14.0     10.77        1
## 4725                    Crema Norteñita 250ml   20.0     15.38        1
## 4726                     Dalmata Marinela 55G    7.0      5.38        1
## 4727             Cremax De Nieve Vainilla 90G   12.0      9.23        1
## 4728       DANUP STRAWBERRY P/BEBER 350GR NAL   14.0     14.00        1
## 4729   Veladora Limonero Supremo C/Aroma 1 Pz   14.5     11.15        1
## 4730                  Gelatina Dany Piña 125G    6.5      6.50        2
## 4731                    Pan Molido Bimbo 210G   15.0     11.54        1
## 4732                      Nutri Leche 1 Litro   16.0     12.31        1
## 4733  Papel Higienico Jumbo 455hojas Rollos 4   26.0     20.00        1
## 4734                        ARROZ NORVER 250G    8.5      6.54        1
## 4735               Jabon Zote Rosa Barra 100G    5.0      3.85        1
## 4736                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 4737     CREMA DENTAL CLEAN MINT TOTAL12 22ML    7.0      5.38        1
## 4738                    Saladitas Gamesa 137G   13.0     10.00        1
## 4739                           Pepsi N. R. 2L   22.0     22.00        1
## 4740                     Powerade Moras 600Ml   18.0     13.85        1
## 4741                     Joya Sabores R. 1.5L   18.0     13.85        1
## 4742               Blanqueador Cloralex 250Ml    5.0      3.85        1
## 4743                     Coca Cola N.R. 1.75L   24.0     24.00        1
## 4744                    Squirt Toronja 1.5 Lt   18.0     18.00        1
## 4745                     MASECA P/TAMAL 1KILO   16.0     12.31        2
## 4746                   Tang Sabor Naranja 15g    5.0      5.00        1
## 4747                            Tang Uva 15gr    5.0      3.85        1
## 4748      DESODORANTE OBAO AUDAZ FOR MEN  65g   23.0     23.00        1
## 4749                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4750           Nectar Manzana Del Valle 250Ml    8.0      8.00        2
## 4751                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4752                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4753                    Saladitas Gamesa 137G   13.0     10.00        2
## 4754                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4755                        Negrito Bimbo 62G   10.0     10.00        1
## 4756        Sopa De Letras Fior Di Pasta 200G    6.5      5.00        2
## 4757                Bimbochitos vainilla 69 g   10.0     10.00        1
## 4758               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 4759                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4760                        Consomate 8 Cubos   16.0     12.31        1
## 4761              Bran Frut Barra De Piña 40G    8.0      8.00        1
## 4762                    Saladitas Gamesa 137G   13.0     10.00        1
## 4763                         Pepsi Lata 355Ml   11.0     11.00        1
## 4764                              Bonafont 1L   11.0     11.00        1
## 4765                      Rebanadas Bimbo 2Pz    5.0      5.00        4
## 4766                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4767                   Tang Limon 1 Sobre 15G    5.0      3.85        1
## 4768               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 4769                       Cigarros Link 20pz   25.0     19.23        1
## 4770                       Cigarros Link 20pz   25.0     19.23        1
## 4771                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 4772        Knorr Sazonador Mi Arroz Rojo 17g    6.5      5.00        1
## 4773    Maravillas Vainilla Gamesa Tubo 116gr   12.0      9.23        1
## 4774                Nescafe Clásico sobre 14g   10.0      7.69        1
## 4775                    Leche Lala Premium 1L   20.0     20.00        1
## 4776                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 4777                           Big Cola 500Ml    8.0      8.00        1
## 4778                   Tang Limon 1 Sobre 15G    5.0      3.85        4
## 4779                   Tang Limon 1 Sobre 15G    5.0      3.85        1
## 4780                Sal Refinada La Fina 500G    7.5      5.77        1
## 4781                       Cigarros Link 20pz   25.0     19.23       10
## 4782                Squirt Toronja N.R. 600Ml   13.0     10.00        1
## 4783                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4784                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4785        FRIJOLES ENTEROS RANCH STYLE 425G   21.0     16.15        1
## 4786                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4787                          Bokados Mix 90G   12.0      9.23        1
## 4788                  Joya Manzana N.R. 500Ml   13.0     13.00        1
## 4789                        Fanta N. R. 500Ml   13.0     13.00        1
## 4790  Salsa Picante Clasica La Botanera 1030G   20.0     15.38        1
## 4791                Nescafe Clásico sobre 14g   10.0      7.69        1
## 4792       Detergente Foca Biodegradable 500G   21.0     16.15        1
## 4793                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4794                 Mirinda Naranja N. R. 2L   22.0     22.00        1
## 4795                        Consomate 8 Cubos   16.0     12.31        1
## 4796 T Femenina Princess Nocturna C/Alas 8Pza   25.5     19.62        1
## 4797                   Kinder Chocolate 12.5g    4.5      3.46        1
## 4798               Blanqueador Cloralex 250Ml    5.0      3.85        1
## 4799                         Tecate Rojo 16Oz   20.0     15.38        1
## 4800                       Doritos Diablo 47G   12.0     12.00        1
## 4801                            Pepsi N.R. 3L   34.0     34.00        1
## 4802                    Leche Lala Premium 1L   20.0     20.00        1
## 4803                  Sopa Maruchan Queso 64G   11.5      8.85        1
## 4804                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4805                  Agua Mineral N.R. 591Ml   15.0     15.00        1
## 4806                           Pepsi N. R. 2L   22.0     22.00        1
## 4807               Coca Cola Light N.R. 600Ml   14.0     14.00        1
## 4808                     Coca Cola N.R. 500Ml   13.0     13.00        1
## 4809                MANTECA VEGETAL INCA 500G   28.0     21.54        1
## 4810                              Bonafont 6L   31.0     23.85        1
## 4811                         Pepsi N.R. 600Ml   13.0     13.00        1
## 4812                  Blanqueador Cloralex 1L   13.0     10.00        1
## 4813                       Cigarros Link 20pz   25.0     19.23        1
## 4814  Salsa Picante Clasica La Botanera 1030G   20.0     15.38        1
## 4815                    Pan Molido Bimbo 210G   15.0     11.54        1
## 4816                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4817                      Arroz Diamante 450g   18.0     13.85        1
## 4818        Knorr Sazonador Mi Arroz Rojo 17g    6.5      5.00        2
## 4819                        Coca Cola N.R. 2L   28.0     28.00        1
## 4820                         Mamut Gamesa 44G    6.0      4.62        2
## 4821                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 4822                    Garrafón Bonafont 19L   40.0     30.77        1
## 4823                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4824                        Powerade Frutas1L   22.0     22.00        1
## 4825     MARLBORO ROJO CAJ. SUAVE 20 CIGARROS   63.0     48.46        1
## 4826                       Cigarros Link 20pz   25.0     19.23        1
## 4827                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4828                 Flash Xtra Lavanda 500Ml    9.5      7.31        1
## 4829           Nectar Manzana Del Valle 250Ml    8.0      8.00        2
## 4830                       Agua Mineral 355Ml    9.0      9.00        1
## 4831                      V8 Campbell´S 340Ml   11.0     11.00        1
## 4832            Pall Mall Tokyo Midnight 20'S   56.0     43.08        1
## 4833                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4834  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        1
## 4835                  MEDIA CREMA NESTLE 190G   12.0      9.23        1
## 4836                            Pepsi N.R. 3L   34.0     34.00        1
## 4837                 Jarritos Tutti Frutti 3L   28.0     21.54        1
## 4838              MARLBORO 100´S ROJO FT 20PZ   63.0     48.46        1
## 4839                        Sprite N. R. 2.5L   30.0     30.00        1
## 4840                     Boing 500ml. Manzana   11.5     11.50        1
## 4841                Giro Chocolate Gamesa 95g   12.0      9.23        1
## 4842                 Choco Roles Marinela 67G   15.0     11.54        1
## 4843                     Detergente Roma 250G   10.0      7.69        1
## 4844                    Knorr Suiza Pollo 2Pz    5.0      3.85        1
## 4845      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4846                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4847                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4848                     Coca Cola Zero 600Ml   14.0     14.00        1
## 4849                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 4850 Queso Crema Philladelphia Barra 190G Kft   37.0     37.00        1
## 4851   Queso Panela Canastita La Villita 200G   26.0     26.00        1
## 4852                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4853                           Pepsi N. R. 2L   22.0     22.00        1
## 4854                       Doritos Diablo 47G   12.0     12.00        1
## 4855                    Saladitas Gamesa 137G   13.0     10.00        1
## 4856                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4857                        Negrito Bimbo 62G   10.0     10.00        1
## 4858                      Rebanadas Bimbo 2Pz    5.0      5.00        1
## 4859                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4860                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4861                   Tang Sabor Naranja 15g    5.0      5.00        1
## 4862           Cheetos Torciditos Nachos 48gr    8.0      8.00        1
## 4863   MITADES DURAZNOS CLEMENTE JACQUES 820G   55.0     42.31        1
## 4864                      Jugo Bida Uva 500Ml   10.5     10.50        1
## 4865                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 4866              M&M Chocolate Display 47.9G   15.0     11.54        2
## 4867                         Kinder Bueno 43G   21.0     16.15        1
## 4868               Pedigree Adulto Pollo 100g   11.0      8.46        1
## 4869                        Coca Cola N.R. 2L   28.0     28.00        1
## 4870                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4871                    Encanton Surtimix 40g   10.0      7.69        1
## 4872                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4873                         Pepsi N.R. 600Ml   13.0     13.00        1
## 4874                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4875                  Medias Noches Bimbo 8Pz   27.0     20.77        2
## 4876      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4877                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4878          Salvo Detergente Líquido 300 ml   17.0     13.08        1
## 4879       Detergente Líquido Más Color 415ml   18.0     13.85        1
## 4880                Kinder Maxi Chocolate 21G    8.0      6.15        1
## 4881                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 4882        Sardina de Tomate California 280g   33.5     25.77        1
## 4883            Jarritos Sabor Mandarina 1.5L   16.0     16.00        1
## 4884              Sabritas Papas Adobadas 45G   13.0     13.00        1
## 4885                 NECTAR MANGO JUMEX 250ML    8.0      8.00        2
## 4886                            Tang Uva 15gr    5.0      3.85        1
## 4887                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 4888                         Pepsi N.R. 600Ml   13.0     13.00        1
## 4889              Sabritas Papas Adobadas 45G   13.0     13.00        1
## 4890                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4891          Pan Molido Crujiente Bimbo 175G   15.0     11.54        1
## 4892                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4893                    Joya Manzana R. 500Ml   10.0     10.00        1
## 4894               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4895                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4896                     Coca Cola N.R. 600Ml   14.0     14.00        1
## 4897                Queso Oaxaca Camelia 200G   29.5     29.50        1
## 4898                    Leche Lala Premium 1L   20.0     20.00        1
## 4899                 VENDA ELASTICA JALOMA 5M    8.0      8.00        1
## 4900                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4901                    Pan Blanco Bimbo 650G   32.0     24.62        1
## 4902                         Pepsi N.R. 400Ml    8.0      8.00        1
## 4903                    Leche Lala Premium 1L   20.0     20.00        1
## 4904                Cerillos Flama 115 Piezas    5.5      5.50        1
## 4905                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4906              Suavitel Aroma De Sol 450Ml   15.0     11.54        1
## 4907      Consomate Nestle Caja 02 Cubos 22gr    5.0      3.85        1
## 4908                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4909                              Epura 10.1L   31.0     23.85        1
## 4910                        Powerade Frutas1L   22.0     22.00        1
## 4911          Jugo De Durazno Del Valle 413Ml   12.0     12.00        1
## 4912                Lala Deslactosada Semi 1L   22.5     17.31        1
## 4913                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4914                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4915    Papel Hig Color 360Hojas Dobles 4Pzas   22.0     16.92        1
## 4916         Crema Colgate Trip/Acc Blanc 50g   11.0      8.46        1
## 4917      FRIJOL PERUANO REFRITO ISADORA 430G   19.0     14.62        1
## 4918            Flash Xtra Brisa Marina 500Ml    9.5      7.31        1
## 4919                        Pepsi N. R. 500Ml   10.0     10.00        1
## 4920                   Jabon Zote Blanco 200G    9.5      7.31        1
## 4921                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4922                      ARIEL EN POLVO 850G   33.0     25.38        1
## 4923   Queso Panela Canastita La Villita 200G   26.0     26.00        1
## 4924                    Saladitas Gamesa 137G   13.0     10.00        1
## 4925               Queso Americano Nutrileche   14.5     14.50        1
## 4926  LALA YOMI UHT VAINILLA CARTON 250ML NAL   11.5     11.50        1
## 4927               Jugo Valle Frut Naranja 1L   18.0     18.00        1
## 4928                               Epura 1.5L   13.0     13.00        1
## 4929                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4930               Coca Cola Retornable 500Ml   10.0     10.00        1
## 4931                       Axion Limon 400 Ml   20.5     15.77        1
## 4932         Pan Bimbo Multigrano Linaza 540G   38.0     29.23        1
## 4933      GERBER VERD CON POLLO Y ARROZ  113G   13.0     10.00        1
## 4934          Gerber Platano 2da. Etapa 113gr   13.0     10.00        1
## 4935                 CERA LIQUIDO BLANCO 60ML   10.0     10.00        1
## 4936            DANUP P/BEBER FRESA 220GR NAL   11.5     11.50        1
## 4937            DANUP P/BEBER FRESA 220GR NAL   11.5     11.50        2
## 4938           MARLBORO ROJO 14S FLIP-TOP BOX   47.0     36.15        1
## 4939                      Rebanadas Bimbo 2Pz    5.0      5.00        2
## 4940       Bubba Xtreme Paleta Mora Azul 17gr    5.0      5.00        1
## 4941       DANUP STRAWBERRY P/BEBER 350GR NAL   14.0     14.00        1
## 4942                            Pepsi N.R. 3L   34.0     34.00        1
## 4943                    Del Valle Mango 250Ml    8.0      8.00        1
## 4944                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4945                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4946                  Medias Noches Bimbo 8Pz   27.0     20.77        2
## 4947                            Pepsi N.R. 3L   34.0     34.00        1
## 4948                        Ruffles Queso 50G   13.0     13.00        1
## 4949                Cerveza Tecate Light 16Oz   20.0     15.38        3
## 4950                        Pepsi N. R. 500Ml   10.0     10.00        1
## 4951                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4952                       Cigarros Link 20pz   25.0     19.23        1
## 4953                     Coca Cola N. R. 2.5L   34.0     34.00        1
## 4954                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4955       Mayonesa Hellmann´S Con Limon 190G   16.0     12.31        1
## 4956                  Medias Noches Bimbo 8Pz   27.0     20.77        1
## 4957                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4958                 CERA LIQUIDO BLANCO 60ML   10.0     10.00        1
## 4959                               Epura 1.5L   13.0     13.00        1
## 4960      Tostileo Queso Y Chile Jalapeño 60G   10.0      7.69        1
## 4961          Pedigree Adulto Sobre Res 100g.   11.0      8.46        3
## 4962          Panquecitos C/Gota De Chocolate   15.0     11.54        1
## 4963          Donitas Espolvoreadas Bimbo 6Pz   12.0     12.00        1
## 4964                Jarrito Tutti Frutti 1.5L   16.0     12.31        1
## 4965                            Pepsi N.R. 3L   34.0     34.00        1
## 4966  Queso Ame Reb Ind 90 Pz Blue House 138G   11.0     11.00        2
## 4967                    Joya Manzana R. 500Ml   10.0     10.00        1
## 4968              Sabritones Chile Limón 60gr   10.0      7.69        2
## 4969       Detergente Foca Biodegradable 250G   10.5      8.08        1
## 4970                    Leche Lala Premium 1L   20.0     20.00        1
## 4971                Cerillos Flama 115 Piezas    5.5      5.50        1
## 4972          Salvo Detergente Líquido 300 ml   17.0     13.08        1
## 4973           Pasta Estrella La Perla 200grs    6.5      5.00        1
## 4974                    Saladitas Gamesa 137G   13.0     10.00        1
## 4975                          Pepsi N.R. 1.5L   18.0     18.00        1
## 4976                 Coca Cola Zero N.R. 2.5L   34.0     26.15        1
## 4977                        Ruffles Queso 50G   13.0     13.00        1
## 4978       DANUP STRAWBERRY P/BEBER 350GR NAL   14.0     14.00        1
## 4979                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4980                 Zucaritas Kelloggs 260Gr   34.0     26.15        1
## 4981                   NIDO KINDER 1 MAS 800G  135.5    135.50        1
## 4982          Trident Xtracare Yerbabuena 16G    8.0      8.00        1
## 4983                       Doritos Nachos 53G   12.0     12.00        1
## 4984                  Cheetos Flaming Hot 48g    8.0      8.00        1
## 4985                Coca Cola Retornable 2.5L   27.0     27.00        1
## 4986                Coca Cola Retornable 1.5L   18.0     18.00        1
## 4987               Garrafon Electropura 20 Lt   38.0     29.23        1
## 4988         AZUCAR ESTANDAR 5 ESTRELLAS 900G   25.0     19.23        1
## 4989                         Ace Actiblu 250G   10.5      8.08        1
## 4990          Pake Taxo Sabritas Botanero 65G   11.0      8.46        1
## 4991                         Pepsi N.R. 400Ml    8.0      8.00        1
## 4992                          Leche Lala 1.8L   33.0     33.00        1
## 4993                       Cigarros Link 20pz   25.0     19.23        1
## 4994           Queso Chihuahua Caperucita 1Kg   38.5     38.50        1
## 4995                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4996                Queso Oaxaca Camelia 200G   29.5     29.50        1
## 4997                  Jarrito Tamarindo 600Ml   13.0     10.00        1
## 4998                         Pepsi N. R. 2.5L   27.0     27.00        1
## 4999                 Coca Cola Light R. 500Ml   10.0      7.69        1
##      F.Ticket NombreDepartamento             NombreFamilia
## 1           1          Abarrotes    Lacteos y Refrigerados
## 2           2          Abarrotes    Lacteos y Refrigerados
## 3           3          Abarrotes            Pan y Tortilla
## 4           3          Abarrotes                   Bebidas
## 5           4          Abarrotes        Limpieza del Hogar
## 6           4          Abarrotes        Limpieza del Hogar
## 7           4          Abarrotes    Lacteos y Refrigerados
## 8           4          Abarrotes        Limpieza del Hogar
## 9           4          Abarrotes          Cuidado Personal
## 10          5          Abarrotes                   Bebidas
## 11          5          Abarrotes                   Bebidas
## 12          6          Abarrotes                   Bebidas
## 13          7          Abarrotes                   Bebidas
## 14          9          Abarrotes                  Galletas
## 15          9          Abarrotes    Lacteos y Refrigerados
## 16          9          Abarrotes                  Galletas
## 17         10          Abarrotes    Lacteos y Refrigerados
## 18         11          Abarrotes        Limpieza del Hogar
## 19         11          Abarrotes    Lacteos y Refrigerados
## 20         11          Abarrotes        Limpieza del Hogar
## 21         11          Abarrotes C. Frías y Salchichonería
## 22         12          Abarrotes    Lacteos y Refrigerados
## 23         13          Abarrotes                   Bebidas
## 24         14          Abarrotes                   Bebidas
## 25         15          Abarrotes            Pan y Tortilla
## 26         15          Abarrotes                   Bebidas
## 27         15          Abarrotes                   Bebidas
## 28         15          Abarrotes                   Bebidas
## 29         16          Abarrotes    Lacteos y Refrigerados
## 30         16          Abarrotes C. Frías y Salchichonería
## 31         16          Abarrotes                   Bebidas
## 32         16          Abarrotes    Lacteos y Refrigerados
## 33         19          Abarrotes                  Galletas
## 34         20          Abarrotes          Cuidado Personal
## 35         20          Abarrotes                   Bebidas
## 36         21          Abarrotes    Lacteos y Refrigerados
## 37         22          Abarrotes                   Bebidas
## 38         22          Abarrotes            Pan y Tortilla
## 39         23          Abarrotes                   Bebidas
## 40         23          Abarrotes                   Bebidas
## 41         23          Abarrotes            Pan y Tortilla
## 42         23          Abarrotes                   Botanas
## 43         23          Abarrotes                   Bebidas
## 44         24          Abarrotes        Limpieza del Hogar
## 45         24          Abarrotes                   Bebidas
## 46         25          Abarrotes    Lacteos y Refrigerados
## 47         25          Abarrotes                   Bebidas
## 48         25          Abarrotes          Cuidado Personal
## 49         26          Abarrotes                   Bebidas
## 50         27          Abarrotes                   Bebidas
## 51         28          Abarrotes                   Bebidas
## 52         29          Abarrotes                   Botanas
## 53         29          Abarrotes                   Botanas
## 54         29          Abarrotes                   Bebidas
## 55         29          Abarrotes    Lacteos y Refrigerados
## 56         30          Abarrotes                   Bebidas
## 57         31          Abarrotes                   Bebidas
## 58         31          Abarrotes    Lacteos y Refrigerados
## 59         31          Abarrotes                   Botanas
## 60         32          Abarrotes                   Bebidas
## 61         32          Abarrotes                   Bebidas
## 62         33          Abarrotes                   Bebidas
## 63         35          Abarrotes    Lacteos y Refrigerados
## 64         35          Abarrotes                   Bebidas
## 65         36          Abarrotes                   Bebidas
## 66         37          Abarrotes                   Bebidas
## 67         37          Abarrotes                   Bebidas
## 68         38          Abarrotes        Limpieza del Hogar
## 69         38          Abarrotes                   Bebidas
## 70         38          Abarrotes        Limpieza del Hogar
## 71         38          Abarrotes                   Bebidas
## 72         39          Abarrotes                   Botanas
## 73         40          Abarrotes                  Dulcería
## 74         41          Abarrotes                   Bebidas
## 75         42          Abarrotes                   Bebidas
## 76         43          Abarrotes                   Botanas
## 77         43          Abarrotes                  Galletas
## 78         44          Abarrotes                   Bebidas
## 79         44          Abarrotes         Granos y Semillas
## 80         46          Abarrotes                   Bebidas
## 81         48          Abarrotes                   Bebidas
## 82         49          Abarrotes                   Botanas
## 83         49          Abarrotes                   Bebidas
## 84         50          Abarrotes                   Botanas
## 85         50          Abarrotes                   Bebidas
## 86         50         Ferretería                Pegamentos
## 87         50          Abarrotes                  Dulcería
## 88         51          Abarrotes                   Bebidas
## 89         52          Abarrotes                   Bebidas
## 90         52          Abarrotes    Lacteos y Refrigerados
## 91         52          Abarrotes                   Bebidas
## 92         53          Abarrotes                   Botanas
## 93         55          Abarrotes                   Bebidas
## 94         59          Abarrotes                   Bebidas
## 95         60          Abarrotes    Lacteos y Refrigerados
## 96         61          Abarrotes                   Botanas
## 97         61          Abarrotes                  Galletas
## 98         61          Abarrotes                   Bebidas
## 99         64          Abarrotes                  Dulcería
## 100        65          Abarrotes                   Bebidas
## 101        67          Abarrotes                   Botanas
## 102        67          Abarrotes                   Bebidas
## 103        67          Abarrotes                   Botanas
## 104        68          Abarrotes                   Bebidas
## 105        69          Abarrotes                   Bebidas
## 106        71          Abarrotes                   Bebidas
## 107        71          Abarrotes                   Bebidas
## 108        72          Abarrotes                   Botanas
## 109        74          Abarrotes        Limpieza del Hogar
## 110        74          Abarrotes                   Bebidas
## 111        75          Abarrotes                   Bebidas
## 112        75          Abarrotes          Cuidado Personal
## 113        77          Abarrotes          Cuidado Personal
## 114        79          Abarrotes                   Bebidas
## 115        80          Abarrotes                   Bebidas
## 116        80          Abarrotes                  Dulcería
## 117        80          Abarrotes                  Dulcería
## 118        80          Abarrotes                  Dulcería
## 119        82          Abarrotes            Pan y Tortilla
## 120        82          Abarrotes                  Cigarros
## 121        82          Abarrotes                   Bebidas
## 122        83          Abarrotes                   Bebidas
## 123        83          Abarrotes                  Dulcería
## 124        86          Abarrotes                   Botanas
## 125        87 Bebes e Infantiles                   Pañales
## 126        87          Abarrotes            Pan y Tortilla
## 127        91          Abarrotes            Pan y Tortilla
## 128        91          Abarrotes                   Bebidas
## 129        92          Abarrotes                   Bebidas
## 130        94 Bebes e Infantiles                   Pañales
## 131        94          Abarrotes    Lacteos y Refrigerados
## 132        94          Abarrotes                   Bebidas
## 133        95          Abarrotes                   Bebidas
## 134        96          Abarrotes                   Botanas
## 135        96          Abarrotes    Lacteos y Refrigerados
## 136        96          Abarrotes                   Bebidas
## 137        97          Abarrotes                   Botanas
## 138        97          Abarrotes            Pan y Tortilla
## 139        97          Abarrotes                   Bebidas
## 140        97          Abarrotes                  Aderezos
## 141        98          Abarrotes                   Bebidas
## 142        99          Abarrotes         Velas y Veladoras
## 143       100          Abarrotes                   Bebidas
## 144       101          Abarrotes                   Bebidas
## 145       101          Abarrotes                   Bebidas
## 146       101          Abarrotes               Desechables
## 147       102          Abarrotes      Salsas y Sazonadores
## 148       103          Abarrotes                   Botanas
## 149       103          Abarrotes                  Galletas
## 150       103          Abarrotes                   Bebidas
## 151       105          Abarrotes        Limpieza del Hogar
## 152       108          Abarrotes    Lacteos y Refrigerados
## 153       108          Abarrotes                   Botanas
## 154       108          Abarrotes                   Botanas
## 155       108          Abarrotes                   Bebidas
## 156       109          Abarrotes        Limpieza del Hogar
## 157       109          Abarrotes                   Bebidas
## 158       110          Abarrotes                  Galletas
## 159       110          Abarrotes                   Bebidas
## 160       110          Abarrotes                   Bebidas
## 161       111          Abarrotes                   Botanas
## 162       111          Abarrotes                   Bebidas
## 163       113          Abarrotes                   Bebidas
## 164       114          Abarrotes                   Bebidas
## 165       115          Abarrotes                  Galletas
## 166       116          Abarrotes                   Bebidas
## 167       117          Abarrotes                   Bebidas
## 168       118          Abarrotes    Lacteos y Refrigerados
## 169       118          Abarrotes                   Bebidas
## 170       119          Abarrotes        Limpieza del Hogar
## 171       119          Abarrotes                  Aderezos
## 172       120          Abarrotes            Pan y Tortilla
## 173       122          Abarrotes                   Bebidas
## 174       125          Abarrotes    Lacteos y Refrigerados
## 175       126          Abarrotes                   Botanas
## 176       126          Abarrotes                   Bebidas
## 177       127          Abarrotes                   Bebidas
## 178       128          Abarrotes                   Botanas
## 179       129          Abarrotes                   Botanas
## 180       131          Abarrotes                  Especias
## 181       131          Abarrotes        Limpieza del Hogar
## 182       132          Abarrotes                   Botanas
## 183       132          Abarrotes        Limpieza del Hogar
## 184       132          Abarrotes                   Bebidas
## 185       133          Abarrotes                   Bebidas
## 186       133          Abarrotes                  Cigarros
## 187       134          Abarrotes                   Botanas
## 188       134          Abarrotes    Lacteos y Refrigerados
## 189       134          Abarrotes            Pan y Tortilla
## 190       134          Abarrotes            Pan y Tortilla
## 191       134          Abarrotes                  Cereales
## 192       134          Abarrotes                   Botanas
## 193       136          Abarrotes                   Botanas
## 194       136          Abarrotes                   Bebidas
## 195       137          Abarrotes                   Botanas
## 196       138          Abarrotes                   Bebidas
## 197       138          Abarrotes                   Bebidas
## 198       140          Abarrotes                   Bebidas
## 199       143          Abarrotes          Cuidado Personal
## 200       144          Abarrotes                   Botanas
## 201       144          Abarrotes                  Galletas
## 202       147          Abarrotes                   Botanas
## 203       147          Abarrotes                   Botanas
## 204       147          Abarrotes                   Botanas
## 205       148          Abarrotes                   Bebidas
## 206       149          Abarrotes               Desechables
## 207       149          Abarrotes               Desechables
## 208       150          Abarrotes            Pan y Tortilla
## 209       150          Abarrotes    Lacteos y Refrigerados
## 210       150          Abarrotes                   Bebidas
## 211       151          Abarrotes    Lacteos y Refrigerados
## 212       151          Abarrotes                   Botanas
## 213       151          Abarrotes    Lacteos y Refrigerados
## 214       151          Abarrotes    Lacteos y Refrigerados
## 215       153          Abarrotes                   Botanas
## 216       153          Abarrotes                   Botanas
## 217       153          Abarrotes                   Botanas
## 218       154          Abarrotes                   Bebidas
## 219       155          Abarrotes                   Botanas
## 220       155          Abarrotes                   Bebidas
## 221       156          Abarrotes                   Botanas
## 222       156          Abarrotes                   Bebidas
## 223       156          Abarrotes                   Bebidas
## 224       156          Abarrotes                   Bebidas
## 225       157          Abarrotes                   Bebidas
## 226       158          Abarrotes                  Dulcería
## 227       158          Abarrotes                   Bebidas
## 228       160          Abarrotes                  Cigarros
## 229       162          Abarrotes                   Bebidas
## 230       163          Abarrotes                   Bebidas
## 231       163          Abarrotes                   Bebidas
## 232       166          Abarrotes                   Bebidas
## 233       166          Abarrotes            Pan y Tortilla
## 234       166          Abarrotes                   Bebidas
## 235       167          Abarrotes                  Especias
## 236       168          Abarrotes                   Botanas
## 237       168          Abarrotes                   Botanas
## 238       168          Abarrotes                   Botanas
## 239       169          Abarrotes                   Bebidas
## 240       170          Abarrotes        Limpieza del Hogar
## 241       170          Abarrotes        Limpieza del Hogar
## 242       172          Abarrotes            Pan y Tortilla
## 243       173          Abarrotes        Limpieza del Hogar
## 244       173          Abarrotes                   Botanas
## 245       175          Abarrotes    Lacteos y Refrigerados
## 246       177          Abarrotes                   Bebidas
## 247       179          Abarrotes                   Bebidas
## 248       179          Abarrotes                   Bebidas
## 249       181          Abarrotes                  Cigarros
## 250       183          Abarrotes                   Bebidas
## 251       184          Abarrotes                   Bebidas
## 252       186          Abarrotes          Cuidado Personal
## 253       187          Abarrotes                   Bebidas
## 254       187          Abarrotes    Lacteos y Refrigerados
## 255       187          Abarrotes    Lacteos y Refrigerados
## 256       187          Abarrotes         Velas y Veladoras
## 257       188          Abarrotes                   Botanas
## 258       188          Abarrotes        Limpieza del Hogar
## 259       189          Abarrotes                   Bebidas
## 260       189          Abarrotes                   Bebidas
## 261       190          Abarrotes                  Cigarros
## 262       190          Abarrotes        Limpieza del Hogar
## 263       190          Abarrotes                   Botanas
## 264       190          Abarrotes        Limpieza del Hogar
## 265       190          Abarrotes                   Botanas
## 266       190          Abarrotes        Limpieza del Hogar
## 267       191          Abarrotes                   Bebidas
## 268       191          Abarrotes                   Botanas
## 269       191          Abarrotes                   Bebidas
## 270       191          Abarrotes                   Botanas
## 271       191          Abarrotes                  Dulcería
## 272       192          Abarrotes                   Bebidas
## 273       193          Abarrotes                  Dulcería
## 274       194          Abarrotes                   Bebidas
## 275       194          Abarrotes        Limpieza del Hogar
## 276       195          Abarrotes                   Bebidas
## 277       195          Abarrotes                   Botanas
## 278       196          Abarrotes    Lacteos y Refrigerados
## 279       196          Abarrotes    Lacteos y Refrigerados
## 280       196          Abarrotes            Pan y Tortilla
## 281       197          Abarrotes    Lacteos y Refrigerados
## 282       197          Abarrotes            Pan y Tortilla
## 283       197          Abarrotes        Limpieza del Hogar
## 284       197          Abarrotes                   Botanas
## 285       197          Abarrotes                  Cigarros
## 286       198          Abarrotes                  Cereales
## 287       200          Abarrotes                   Bebidas
## 288       201          Abarrotes                   Bebidas
## 289       202          Abarrotes                   Bebidas
## 290       203 Bebes e Infantiles                   Pañales
## 291       204          Abarrotes                   Bebidas
## 292       204          Abarrotes                   Bebidas
## 293       205          Abarrotes                   Botanas
## 294       205          Abarrotes                   Bebidas
## 295       206          Abarrotes                   Botanas
## 296       206          Abarrotes                   Botanas
## 297       206          Abarrotes                   Bebidas
## 298       207          Abarrotes         Velas y Veladoras
## 299       208          Abarrotes        Limpieza del Hogar
## 300       208          Abarrotes        Limpieza del Hogar
## 301       209          Abarrotes                   Bebidas
## 302       210          Abarrotes            Pan y Tortilla
## 303       210          Abarrotes            Pan y Tortilla
## 304       211          Abarrotes                   Botanas
## 305       212          Abarrotes        Limpieza del Hogar
## 306       212          Abarrotes                  Cigarros
## 307       213          Abarrotes                   Bebidas
## 308       214          Abarrotes                   Bebidas
## 309       215          Abarrotes                  Cigarros
## 310       215          Abarrotes                   Bebidas
## 311       217          Abarrotes                   Bebidas
## 312       219          Abarrotes                   Bebidas
## 313       220          Abarrotes                   Botanas
## 314       220          Abarrotes    Lacteos y Refrigerados
## 315       220          Abarrotes                   Bebidas
## 316       221          Abarrotes                   Botanas
## 317       222          Abarrotes                   Botanas
## 318       222          Abarrotes                   Bebidas
## 319       223          Abarrotes            Pan y Tortilla
## 320       223          Abarrotes                   Bebidas
## 321       225          Abarrotes            Pan y Tortilla
## 322       225          Abarrotes            Pan y Tortilla
## 323       227          Abarrotes        Limpieza del Hogar
## 324       227          Abarrotes            Pan y Tortilla
## 325       227          Abarrotes                   Bebidas
## 326       228          Abarrotes                   Bebidas
## 327       229          Abarrotes                   Bebidas
## 328       229          Abarrotes                  Cigarros
## 329       231          Abarrotes                   Botanas
## 330       231          Abarrotes                   Botanas
## 331       231          Abarrotes                   Botanas
## 332       231          Abarrotes    Lacteos y Refrigerados
## 333       231          Abarrotes                   Bebidas
## 334       232          Abarrotes                   Bebidas
## 335       232          Abarrotes                   Bebidas
## 336       232          Abarrotes                   Bebidas
## 337       233          Abarrotes                   Bebidas
## 338       234          Abarrotes    Lacteos y Refrigerados
## 339       235          Abarrotes                   Botanas
## 340       235          Abarrotes                   Botanas
## 341       236          Abarrotes    Lacteos y Refrigerados
## 342       236          Abarrotes                   Botanas
## 343       236          Abarrotes                   Bebidas
## 344       237          Abarrotes                   Botanas
## 345       238          Abarrotes                  Galletas
## 346       238          Abarrotes            Pan y Tortilla
## 347       238          Abarrotes                   Bebidas
## 348       239          Abarrotes                   Botanas
## 349       239          Abarrotes                   Bebidas
## 350       239          Abarrotes            Pan y Tortilla
## 351       239          Abarrotes                   Bebidas
## 352       240          Abarrotes                   Bebidas
## 353       242          Abarrotes                   Bebidas
## 354       242          Abarrotes                   Bebidas
## 355       244          Abarrotes        Limpieza del Hogar
## 356       244          Abarrotes                   Botanas
## 357       244          Abarrotes                   Bebidas
## 358       244          Abarrotes        Limpieza del Hogar
## 359       245          Abarrotes                   Botanas
## 360       245          Abarrotes                   Botanas
## 361       246          Abarrotes                   Bebidas
## 362       246          Abarrotes                   Bebidas
## 363       247          Abarrotes                   Bebidas
## 364       247          Abarrotes                   Bebidas
## 365       251          Abarrotes                   Bebidas
## 366       252          Abarrotes                   Bebidas
## 367       252          Abarrotes        Limpieza del Hogar
## 368       252          Abarrotes         Granos y Semillas
## 369       253          Abarrotes        Limpieza del Hogar
## 370       253          Abarrotes        Limpieza del Hogar
## 371       253          Abarrotes                   Bebidas
## 372       253          Abarrotes         Velas y Veladoras
## 373       256          Abarrotes            Pan y Tortilla
## 374       256          Abarrotes                   Bebidas
## 375       256          Abarrotes                   Bebidas
## 376       257          Abarrotes                   Bebidas
## 377       257          Abarrotes                   Bebidas
## 378       258          Abarrotes                   Bebidas
## 379       261          Abarrotes                   Bebidas
## 380       262          Abarrotes    Lacteos y Refrigerados
## 381       263          Abarrotes                    Aceite
## 382       263          Abarrotes        Limpieza del Hogar
## 383       264          Abarrotes                   Bebidas
## 384       264          Abarrotes                   Bebidas
## 385       264          Abarrotes                   Bebidas
## 386       265          Abarrotes            Pan y Tortilla
## 387       266          Abarrotes    Lacteos y Refrigerados
## 388       268          Abarrotes                   Botanas
## 389       268          Abarrotes                   Botanas
## 390       268          Abarrotes                   Bebidas
## 391       273          Abarrotes                   Bebidas
## 392       274          Abarrotes                   Bebidas
## 393       274          Abarrotes                   Bebidas
## 394       275          Abarrotes                   Bebidas
## 395       275          Abarrotes                   Bebidas
## 396       279          Abarrotes                   Bebidas
## 397       279          Abarrotes                   Bebidas
## 398       280          Abarrotes                   Botanas
## 399       280          Abarrotes        Limpieza del Hogar
## 400       282          Abarrotes                   Botanas
## 401       282          Abarrotes        Limpieza del Hogar
## 402       282          Abarrotes                   Bebidas
## 403       282          Abarrotes                   Bebidas
## 404       282          Abarrotes    Lacteos y Refrigerados
## 405       284          Abarrotes                   Botanas
## 406       284          Abarrotes                   Bebidas
## 407       285          Abarrotes          Cuidado Personal
## 408       285          Abarrotes                   Botanas
## 409       285          Abarrotes                   Botanas
## 410       285          Abarrotes                   Botanas
## 411       285          Abarrotes                   Botanas
## 412       285          Abarrotes                   Bebidas
## 413       285          Abarrotes                   Botanas
## 414       285          Abarrotes                   Bebidas
## 415       287          Abarrotes                   Bebidas
## 416       289          Abarrotes                   Bebidas
## 417       289          Abarrotes                  Cigarros
## 418       289          Abarrotes               Desechables
## 419       290          Abarrotes      Te, Chocolate y Café
## 420       291          Abarrotes                   Botanas
## 421       292           Mercería                    Varios
## 422       292           Mercería                    Varios
## 423       293          Abarrotes        Limpieza del Hogar
## 424       293          Abarrotes            Pan y Tortilla
## 425       293          Abarrotes                   Bebidas
## 426       294          Abarrotes                   Bebidas
## 427       294          Abarrotes                   Bebidas
## 428       297          Abarrotes                   Bebidas
## 429       301          Abarrotes                   Botanas
## 430       303          Abarrotes                  Aderezos
## 431       303          Abarrotes                   Bebidas
## 432       304          Abarrotes                   Bebidas
## 433       304          Abarrotes                   Bebidas
## 434       305          Abarrotes                   Bebidas
## 435       306          Abarrotes                   Bebidas
## 436       308          Abarrotes                   Bebidas
## 437       308          Abarrotes                   Bebidas
## 438       308          Abarrotes                   Bebidas
## 439       309          Abarrotes                   Botanas
## 440       311          Abarrotes        Limpieza del Hogar
## 441       311          Abarrotes            Pan y Tortilla
## 442       312          Abarrotes                   Bebidas
## 443       313          Abarrotes            Pan y Tortilla
## 444       313          Abarrotes                   Bebidas
## 445       313          Abarrotes                   Bebidas
## 446       314          Abarrotes                   Bebidas
## 447       314          Abarrotes                   Botanas
## 448       314          Abarrotes                   Bebidas
## 449       314          Abarrotes            Pan y Tortilla
## 450       314          Abarrotes                   Botanas
## 451       315          Abarrotes          Cuidado Personal
## 452       316          Abarrotes                   Bebidas
## 453       317          Abarrotes                   Bebidas
## 454       318          Abarrotes                   Bebidas
## 455       318          Abarrotes                   Bebidas
## 456       320          Abarrotes         Granos y Semillas
## 457       321          Abarrotes      Te, Chocolate y Café
## 458       321          Abarrotes                  Dulcería
## 459       322          Abarrotes                   Bebidas
## 460       322          Abarrotes        Limpieza del Hogar
## 461       322          Abarrotes            Pan y Tortilla
## 462       322          Abarrotes        Limpieza del Hogar
## 463       325          Abarrotes                   Bebidas
## 464       326          Abarrotes                   Bebidas
## 465       327          Abarrotes                  Galletas
## 466       327          Abarrotes                   Bebidas
## 467       327          Abarrotes                   Bebidas
## 468       328          Abarrotes                   Bebidas
## 469       328          Abarrotes                   Bebidas
## 470       329          Abarrotes                   Bebidas
## 471       329          Abarrotes                   Bebidas
## 472       329          Abarrotes                   Bebidas
## 473       330          Abarrotes            Pan y Tortilla
## 474       332          Abarrotes                   Bebidas
## 475       333          Abarrotes                   Bebidas
## 476       334          Abarrotes         Velas y Veladoras
## 477       335          Abarrotes                   Botanas
## 478       337          Abarrotes                   Bebidas
## 479       338          Abarrotes                   Bebidas
## 480       339          Abarrotes                   Bebidas
## 481       340          Abarrotes            Pan y Tortilla
## 482       340          Abarrotes                   Botanas
## 483       340          Abarrotes                   Bebidas
## 484       341          Abarrotes                   Bebidas
## 485       341          Abarrotes    Harinas y Complementos
## 486       341          Abarrotes                  Mantecas
## 487       342          Abarrotes                  Galletas
## 488       342          Abarrotes                   Bebidas
## 489       343          Abarrotes                  Galletas
## 490       343          Abarrotes                  Galletas
## 491       343          Abarrotes        Limpieza del Hogar
## 492       344          Abarrotes      Salsas y Sazonadores
## 493       344          Abarrotes                  Galletas
## 494       344          Abarrotes                   Botanas
## 495       344          Abarrotes                  Dulcería
## 496       344          Abarrotes                   Bebidas
## 497       344          Abarrotes      Salsas y Sazonadores
## 498       345          Abarrotes                   Bebidas
## 499       346          Abarrotes                   Bebidas
## 500       347          Abarrotes        Limpieza del Hogar
## 501       347          Abarrotes        Limpieza del Hogar
## 502       347          Abarrotes                   Bebidas
## 503       348          Abarrotes                   Bebidas
## 504       349          Abarrotes                   Bebidas
## 505       350          Abarrotes                   Bebidas
## 506       353          Abarrotes                   Bebidas
## 507       354          Abarrotes                   Bebidas
## 508       354          Abarrotes                   Cerveza
## 509       354          Abarrotes                  Cigarros
## 510       356          Abarrotes                   Bebidas
## 511       356          Abarrotes                   Bebidas
## 512       356          Abarrotes                  Dulcería
## 513       357          Abarrotes        Limpieza del Hogar
## 514       357          Abarrotes        Limpieza del Hogar
## 515       357          Abarrotes                   Bebidas
## 516       358          Abarrotes        Limpieza del Hogar
## 517       358          Abarrotes    Lacteos y Refrigerados
## 518       358          Abarrotes        Limpieza del Hogar
## 519       358          Abarrotes        Limpieza del Hogar
## 520       358          Abarrotes                   Bebidas
## 521       359          Abarrotes                   Botanas
## 522       359          Abarrotes            Pan y Tortilla
## 523       359          Abarrotes                   Bebidas
## 524       359          Abarrotes                   Bebidas
## 525       359          Abarrotes    Lacteos y Refrigerados
## 526       360          Abarrotes                   Bebidas
## 527       360          Abarrotes                   Bebidas
## 528       361          Abarrotes                   Botanas
## 529       361          Abarrotes                   Botanas
## 530       361          Abarrotes                   Bebidas
## 531       362          Abarrotes          Cuidado Personal
## 532       363          Abarrotes                   Bebidas
## 533       368          Abarrotes                  Cigarros
## 534       368          Abarrotes                   Bebidas
## 535       368          Abarrotes                   Bebidas
## 536       369          Abarrotes                   Bebidas
## 537       370          Abarrotes                   Bebidas
## 538       370          Abarrotes                   Bebidas
## 539       371          Abarrotes                   Bebidas
## 540       373          Abarrotes                   Bebidas
## 541       374          Abarrotes                   Bebidas
## 542       375          Abarrotes                   Bebidas
## 543       376          Abarrotes                   Bebidas
## 544       376          Abarrotes                   Bebidas
## 545       377          Abarrotes                   Bebidas
## 546       377          Abarrotes                   Bebidas
## 547       378          Abarrotes                   Bebidas
## 548       379          Abarrotes                   Botanas
## 549       379          Abarrotes                   Bebidas
## 550       379          Abarrotes                   Bebidas
## 551       379          Abarrotes                   Bebidas
## 552       379          Abarrotes                   Bebidas
## 553       380          Abarrotes                  Cigarros
## 554       381          Abarrotes                   Latería
## 555       382          Abarrotes                   Bebidas
## 556       383          Abarrotes                   Botanas
## 557       383          Abarrotes                  Galletas
## 558       383          Abarrotes            Pan y Tortilla
## 559       384          Abarrotes                   Botanas
## 560       384          Abarrotes                   Botanas
## 561       384          Abarrotes                   Cerveza
## 562       385          Abarrotes                   Bebidas
## 563       386          Abarrotes                   Latería
## 564       386          Abarrotes                   Bebidas
## 565       387          Abarrotes    Lacteos y Refrigerados
## 566       387          Abarrotes                   Bebidas
## 567       387          Abarrotes    Lacteos y Refrigerados
## 568       388          Abarrotes                   Botanas
## 569       389          Abarrotes                   Bebidas
## 570       390          Abarrotes                  Dulcería
## 571       390          Abarrotes                  Dulcería
## 572       392          Abarrotes         Granos y Semillas
## 573       393          Abarrotes                   Bebidas
## 574       394          Abarrotes    Lacteos y Refrigerados
## 575       394          Abarrotes    Lacteos y Refrigerados
## 576       395          Abarrotes                   Bebidas
## 577       395          Abarrotes                   Bebidas
## 578       395          Abarrotes                   Bebidas
## 579       395          Abarrotes                  Dulcería
## 580       396          Abarrotes                   Bebidas
## 581       397          Abarrotes    Lacteos y Refrigerados
## 582       397          Abarrotes                    Aceite
## 583       398          Abarrotes                   Botanas
## 584       398          Abarrotes                   Botanas
## 585       398          Abarrotes                   Botanas
## 586       398          Abarrotes            Pan y Tortilla
## 587       398          Abarrotes            Pan y Tortilla
## 588       398          Abarrotes                   Bebidas
## 589       400          Abarrotes          Cuidado Personal
## 590       400          Abarrotes          Cuidado Personal
## 591       400          Abarrotes                   Bebidas
## 592       400          Abarrotes                   Bebidas
## 593       407          Abarrotes                   Botanas
## 594       407          Abarrotes                   Botanas
## 595       408          Abarrotes                   Bebidas
## 596       409          Abarrotes                  Galletas
## 597       409          Abarrotes    Lacteos y Refrigerados
## 598       409          Abarrotes                   Bebidas
## 599       410          Abarrotes                   Bebidas
## 600       410          Abarrotes                   Bebidas
## 601       411          Abarrotes                   Bebidas
## 602       412          Abarrotes    Lacteos y Refrigerados
## 603       412          Abarrotes                   Bebidas
## 604       415          Abarrotes               Desechables
## 605       417          Abarrotes      Te, Chocolate y Café
## 606       417          Abarrotes                  Cereales
## 607       418          Abarrotes                   Botanas
## 608       419          Abarrotes    Lacteos y Refrigerados
## 609       419          Abarrotes        Limpieza del Hogar
## 610       419          Abarrotes          Cuidado Personal
## 611       419          Abarrotes          Cuidado Personal
## 612       419          Abarrotes          Cuidado Personal
## 613       421          Abarrotes          Cuidado Personal
## 614       421          Abarrotes          Cuidado Personal
## 615       424          Abarrotes                   Botanas
## 616       424          Abarrotes                   Botanas
## 617       424          Abarrotes                   Botanas
## 618       426          Abarrotes                   Bebidas
## 619       427          Abarrotes                   Latería
## 620       427          Abarrotes                   Bebidas
## 621       428          Abarrotes                  Galletas
## 622       429          Abarrotes                   Bebidas
## 623       431          Abarrotes    Lacteos y Refrigerados
## 624       431          Abarrotes                   Bebidas
## 625       432          Abarrotes                   Bebidas
## 626       432          Abarrotes                   Bebidas
## 627       433          Abarrotes                   Botanas
## 628       434          Abarrotes                   Bebidas
## 629       434          Abarrotes                  Cigarros
## 630       435          Abarrotes                   Bebidas
## 631       437          Abarrotes                   Botanas
## 632       437          Abarrotes                   Botanas
## 633       438          Abarrotes            Pan y Tortilla
## 634       440          Abarrotes                   Botanas
## 635       441          Abarrotes    Harinas y Complementos
## 636       441          Abarrotes                   Bebidas
## 637       442          Abarrotes      Salsas y Sazonadores
## 638       446          Abarrotes                  Cigarros
## 639       447          Abarrotes                   Botanas
## 640       449          Abarrotes                   Bebidas
## 641       454          Abarrotes                   Botanas
## 642       454          Abarrotes                   Bebidas
## 643       455          Abarrotes                   Bebidas
## 644       456          Abarrotes                   Bebidas
## 645       457          Abarrotes                   Bebidas
## 646       457          Abarrotes                   Bebidas
## 647       457          Abarrotes               Desechables
## 648       458          Abarrotes                   Bebidas
## 649       458          Abarrotes                   Botanas
## 650       458          Abarrotes                   Bebidas
## 651       460          Abarrotes                   Bebidas
## 652       461          Abarrotes                   Bebidas
## 653       463          Abarrotes                   Bebidas
## 654       464          Abarrotes                   Bebidas
## 655       465          Abarrotes            Sopas y Pastas
## 656       465          Abarrotes            Sopas y Pastas
## 657       465          Abarrotes            Sopas y Pastas
## 658       465          Abarrotes                  Cigarros
## 659       466          Abarrotes    Harinas y Complementos
## 660       466          Abarrotes                   Bebidas
## 661       467          Abarrotes                   Bebidas
## 662       468          Abarrotes                   Bebidas
## 663       469          Abarrotes                   Bebidas
## 664       469          Abarrotes                   Bebidas
## 665       469          Abarrotes                   Bebidas
## 666       470          Abarrotes    Lacteos y Refrigerados
## 667       470          Abarrotes      Salsas y Sazonadores
## 668       470          Abarrotes            Pan y Tortilla
## 669       470          Abarrotes                   Bebidas
## 670       471          Abarrotes                   Bebidas
## 671       471          Abarrotes                   Bebidas
## 672       472          Abarrotes                  Especias
## 673       472          Abarrotes                   Bebidas
## 674       472          Abarrotes                   Bebidas
## 675       472          Abarrotes                   Bebidas
## 676       472          Abarrotes                   Bebidas
## 677       473          Abarrotes                   Bebidas
## 678       473          Abarrotes                  Cigarros
## 679       474          Abarrotes                   Bebidas
## 680       474          Abarrotes      Salsas y Sazonadores
## 681       475          Abarrotes                   Bebidas
## 682       475          Abarrotes                   Bebidas
## 683       476          Abarrotes      Salsas y Sazonadores
## 684       476          Abarrotes            Pan y Tortilla
## 685       478          Abarrotes          Cuidado Personal
## 686       479          Abarrotes                   Bebidas
## 687       479          Abarrotes                   Bebidas
## 688       480          Abarrotes                   Bebidas
## 689       480    Vinos y Licores                   Tequila
## 690       480          Abarrotes                   Bebidas
## 691       481          Abarrotes                   Bebidas
## 692       481          Abarrotes                   Botanas
## 693       481          Abarrotes                   Bebidas
## 694       482          Abarrotes                  Mantecas
## 695       483          Abarrotes          Cuidado Personal
## 696       483          Abarrotes                   Bebidas
## 697       484          Abarrotes                   Bebidas
## 698       484          Abarrotes                   Bebidas
## 699       488          Abarrotes                   Bebidas
## 700       489          Abarrotes                   Botanas
## 701       489          Abarrotes                   Botanas
## 702       489          Abarrotes                   Bebidas
## 703       489          Abarrotes                   Botanas
## 704       489          Abarrotes                  Cigarros
## 705       492          Abarrotes    Lacteos y Refrigerados
## 706       492          Abarrotes    Lacteos y Refrigerados
## 707       492          Abarrotes    Lacteos y Refrigerados
## 708       492          Abarrotes                  Cigarros
## 709       493          Abarrotes    Lacteos y Refrigerados
## 710       493          Abarrotes                  Cigarros
## 711       496          Abarrotes                  Dulcería
## 712       497          Abarrotes                  Dulcería
## 713       498          Abarrotes                  Cigarros
## 714       499          Abarrotes                  Cigarros
## 715       501          Abarrotes                  Galletas
## 716       502          Abarrotes                   Bebidas
## 717       502          Abarrotes            Pan y Tortilla
## 718       502          Abarrotes    Lacteos y Refrigerados
## 719       504          Abarrotes                   Bebidas
## 720       505          Abarrotes                   Bebidas
## 721       506          Abarrotes                   Botanas
## 722       506          Abarrotes                   Botanas
## 723       506          Abarrotes                   Bebidas
## 724       510          Abarrotes         Velas y Veladoras
## 725       510          Abarrotes                   Bebidas
## 726       510          Abarrotes                   Botanas
## 727       510          Abarrotes         Velas y Veladoras
## 728       511          Abarrotes    Lacteos y Refrigerados
## 729       512          Abarrotes                   Bebidas
## 730       513          Abarrotes                   Botanas
## 731       513          Abarrotes                   Botanas
## 732       513          Abarrotes                  Dulcería
## 733       514          Abarrotes                   Bebidas
## 734       516          Abarrotes            Pan y Tortilla
## 735       516          Abarrotes                   Bebidas
## 736       517          Abarrotes                   Bebidas
## 737       518          Abarrotes                   Bebidas
## 738       518          Abarrotes                   Bebidas
## 739       519          Abarrotes    Lacteos y Refrigerados
## 740       519          Abarrotes C. Frías y Salchichonería
## 741       521          Abarrotes                   Botanas
## 742       521          Abarrotes                   Botanas
## 743       521          Abarrotes                   Bebidas
## 744       521          Abarrotes                   Bebidas
## 745       521          Abarrotes                   Bebidas
## 746       521          Abarrotes                   Bebidas
## 747       522          Abarrotes                   Botanas
## 748       522          Abarrotes                   Botanas
## 749       522          Abarrotes                   Bebidas
## 750       523          Abarrotes                  Cigarros
## 751       524          Abarrotes                   Botanas
## 752       524          Abarrotes                   Bebidas
## 753       525 Bebes e Infantiles                Alimentos 
## 754       525          Abarrotes         Granos y Semillas
## 755       526          Abarrotes                   Bebidas
## 756       528          Abarrotes      Salsas y Sazonadores
## 757       529          Abarrotes    Lacteos y Refrigerados
## 758       529          Abarrotes                   Bebidas
## 759       529          Abarrotes                  Cigarros
## 760       531          Abarrotes          Cuidado Personal
## 761       532          Abarrotes          Cuidado Personal
## 762       532          Abarrotes                   Bebidas
## 763       534          Abarrotes                   Bebidas
## 764       536          Abarrotes               Desechables
## 765       537          Abarrotes                  Galletas
## 766       537          Abarrotes                   Botanas
## 767       538          Abarrotes                   Bebidas
## 768       538          Abarrotes                   Botanas
## 769       538          Abarrotes          Cuidado Personal
## 770       539          Abarrotes                  Cigarros
## 771       541          Abarrotes                   Botanas
## 772       541          Abarrotes                   Bebidas
## 773       541          Abarrotes        Limpieza del Hogar
## 774       542          Abarrotes                  Galletas
## 775       542          Abarrotes                  Galletas
## 776       542          Abarrotes    Lacteos y Refrigerados
## 777       542          Abarrotes                   Bebidas
## 778       542          Abarrotes                   Bebidas
## 779       545          Abarrotes                   Bebidas
## 780       546          Abarrotes                  Mantecas
## 781       547          Abarrotes    Harinas y Complementos
## 782       548          Abarrotes            Pan y Tortilla
## 783       549          Abarrotes    Lacteos y Refrigerados
## 784       550          Abarrotes                  Galletas
## 785       551          Abarrotes                    Aceite
## 786       552          Abarrotes    Lacteos y Refrigerados
## 787       553          Abarrotes                   Bebidas
## 788       554          Abarrotes    Lacteos y Refrigerados
## 789       555          Abarrotes                  Dulcería
## 790       556          Abarrotes                   Bebidas
## 791       556          Abarrotes          Cuidado Personal
## 792       557          Abarrotes                   Bebidas
## 793       557          Abarrotes                   Bebidas
## 794       558          Abarrotes    Lacteos y Refrigerados
## 795       558          Abarrotes            Pan y Tortilla
## 796       559          Abarrotes            Pan y Tortilla
## 797       559          Abarrotes                   Bebidas
## 798       562          Abarrotes                   Bebidas
## 799       564          Abarrotes                   Bebidas
## 800       564          Abarrotes         Velas y Veladoras
## 801       565          Abarrotes                   Bebidas
## 802       565          Abarrotes                  Dulcería
## 803       566          Abarrotes         Velas y Veladoras
## 804       567          Abarrotes                   Bebidas
## 805       569          Abarrotes                   Bebidas
## 806       569          Abarrotes                   Bebidas
## 807       571          Abarrotes                   Bebidas
## 808       573          Abarrotes                   Botanas
## 809       575          Abarrotes                  Galletas
## 810       576          Abarrotes                   Bebidas
## 811       577          Abarrotes                   Bebidas
## 812       577          Abarrotes                   Bebidas
## 813       578          Abarrotes                   Bebidas
## 814       579          Abarrotes                   Bebidas
## 815       579          Abarrotes            Pan y Tortilla
## 816       580          Abarrotes         Granos y Semillas
## 817       581          Abarrotes                   Bebidas
## 818       581          Abarrotes                   Bebidas
## 819       584          Abarrotes      Salsas y Sazonadores
## 820       584          Abarrotes                   Botanas
## 821       585          Abarrotes                   Botanas
## 822       585          Abarrotes                   Bebidas
## 823       587          Abarrotes            Pan y Tortilla
## 824       587          Abarrotes                   Bebidas
## 825       588          Abarrotes                   Botanas
## 826       589          Abarrotes                   Bebidas
## 827       591          Abarrotes                   Botanas
## 828       591          Abarrotes    Lacteos y Refrigerados
## 829       591          Abarrotes                   Bebidas
## 830       591          Abarrotes                   Bebidas
## 831       592          Abarrotes                  Galletas
## 832       592          Abarrotes                   Bebidas
## 833       592          Abarrotes                   Bebidas
## 834       592          Abarrotes                   Latería
## 835       592          Abarrotes                  Galletas
## 836       594          Abarrotes                   Bebidas
## 837       595          Abarrotes                   Bebidas
## 838       595          Abarrotes            Pan y Tortilla
## 839       595          Abarrotes    Lacteos y Refrigerados
## 840       595          Abarrotes          Cuidado Personal
## 841       596          Abarrotes    Lacteos y Refrigerados
## 842       596          Abarrotes            Pan y Tortilla
## 843       596          Abarrotes                   Bebidas
## 844       597          Abarrotes                   Bebidas
## 845       597          Abarrotes                   Bebidas
## 846       600          Abarrotes                   Latería
## 847       600          Abarrotes                   Botanas
## 848       600          Abarrotes                   Bebidas
## 849       600          Abarrotes        Limpieza del Hogar
## 850       601          Abarrotes                   Botanas
## 851       601          Abarrotes                   Bebidas
## 852       602          Abarrotes    Lacteos y Refrigerados
## 853       602          Abarrotes            Pan y Tortilla
## 854       602          Abarrotes                  Galletas
## 855       602          Abarrotes                  Galletas
## 856       602          Abarrotes    Lacteos y Refrigerados
## 857       603          Abarrotes                  Especias
## 858       604          Abarrotes                   Bebidas
## 859       604          Abarrotes                   Bebidas
## 860       604          Abarrotes                   Bebidas
## 861       605          Abarrotes                   Bebidas
## 862       607          Abarrotes            Pan y Tortilla
## 863       607          Abarrotes            Pan y Tortilla
## 864       607          Abarrotes                   Bebidas
## 865       608          Abarrotes            Pan y Tortilla
## 866       608          Abarrotes                  Galletas
## 867       608          Abarrotes                   Bebidas
## 868       608          Abarrotes    Lacteos y Refrigerados
## 869       611          Abarrotes                   Botanas
## 870       611          Abarrotes                   Bebidas
## 871       611          Abarrotes                  Dulcería
## 872       612          Abarrotes                   Bebidas
## 873       613          Abarrotes                   Bebidas
## 874       614          Abarrotes                   Bebidas
## 875       615          Abarrotes                   Bebidas
## 876       615          Abarrotes                   Bebidas
## 877       616          Abarrotes                   Bebidas
## 878       616          Abarrotes                   Bebidas
## 879       617          Abarrotes    Lacteos y Refrigerados
## 880       617          Abarrotes    Lacteos y Refrigerados
## 881       617          Abarrotes                   Bebidas
## 882       619          Abarrotes                   Bebidas
## 883       619          Abarrotes                   Botanas
## 884       622          Abarrotes                  Cigarros
## 885       622          Abarrotes                   Bebidas
## 886       623          Abarrotes                   Bebidas
## 887       625          Abarrotes                   Botanas
## 888       625          Abarrotes                   Bebidas
## 889       627          Abarrotes                  Galletas
## 890       627          Abarrotes    Lacteos y Refrigerados
## 891       630          Abarrotes                   Bebidas
## 892       631          Abarrotes                   Bebidas
## 893       632          Abarrotes                   Bebidas
## 894       633          Abarrotes                   Bebidas
## 895       633          Abarrotes                   Botanas
## 896       634          Abarrotes                  Galletas
## 897       634          Abarrotes                   Bebidas
## 898       634          Abarrotes                  Galletas
## 899       635          Abarrotes                   Cerveza
## 900       635          Abarrotes                   Bebidas
## 901       638          Abarrotes          Cuidado Personal
## 902       639          Abarrotes                  Cereales
## 903       641          Abarrotes        Limpieza del Hogar
## 904       642          Abarrotes        Limpieza del Hogar
## 905       642          Abarrotes                   Latería
## 906       642          Abarrotes                   Latería
## 907       643          Abarrotes                   Bebidas
## 908       644          Abarrotes                   Latería
## 909       644          Abarrotes                   Latería
## 910       644          Abarrotes         Granos y Semillas
## 911       644          Abarrotes                    Aceite
## 912       646          Abarrotes                   Bebidas
## 913       646          Abarrotes                   Bebidas
## 914       646          Abarrotes                   Botanas
## 915       650          Abarrotes                   Bebidas
## 916       651          Abarrotes        Limpieza del Hogar
## 917       651          Abarrotes    Lacteos y Refrigerados
## 918       651          Abarrotes    Lacteos y Refrigerados
## 919       651          Abarrotes        Limpieza del Hogar
## 920       651          Abarrotes        Limpieza del Hogar
## 921       651          Abarrotes                   Bebidas
## 922       654          Abarrotes            Pan y Tortilla
## 923       654          Abarrotes                   Bebidas
## 924       654          Abarrotes                   Bebidas
## 925       655          Abarrotes            Pan y Tortilla
## 926       655          Abarrotes            Pan y Tortilla
## 927       656          Abarrotes    Lacteos y Refrigerados
## 928       658          Abarrotes                   Bebidas
## 929       658          Abarrotes                   Bebidas
## 930       660          Abarrotes                   Bebidas
## 931       660          Abarrotes                  Especias
## 932       660          Abarrotes                   Bebidas
## 933       661          Abarrotes        Limpieza del Hogar
## 934       662          Abarrotes    Lacteos y Refrigerados
## 935       662          Abarrotes                   Bebidas
## 936       662          Abarrotes         Velas y Veladoras
## 937       663          Abarrotes                   Botanas
## 938       665          Abarrotes                   Latería
## 939       665          Abarrotes               Desechables
## 940       667          Abarrotes            Pan y Tortilla
## 941       667          Abarrotes                  Cigarros
## 942       668          Abarrotes            Pan y Tortilla
## 943       668          Abarrotes                   Bebidas
## 944       668          Abarrotes            Pan y Tortilla
## 945       669          Abarrotes            Pan y Tortilla
## 946       669          Abarrotes C. Frías y Salchichonería
## 947       669          Abarrotes                   Bebidas
## 948       670          Abarrotes                   Bebidas
## 949       671          Abarrotes        Limpieza del Hogar
## 950       671          Abarrotes          Cuidado Personal
## 951       674          Abarrotes            Pan y Tortilla
## 952       676          Abarrotes                   Botanas
## 953       676          Abarrotes                  Cigarros
## 954       676          Abarrotes         Granos y Semillas
## 955       679          Abarrotes                   Bebidas
## 956       679          Abarrotes                   Bebidas
## 957       679          Abarrotes                   Bebidas
## 958       680          Abarrotes                   Botanas
## 959       680          Abarrotes                  Cigarros
## 960       681          Abarrotes                   Bebidas
## 961       681          Abarrotes                   Botanas
## 962       682          Abarrotes                   Bebidas
## 963       682          Abarrotes                   Botanas
## 964       682          Abarrotes            Pan y Tortilla
## 965       682          Abarrotes                   Bebidas
## 966       682          Abarrotes                   Bebidas
## 967       683          Abarrotes                  Dulcería
## 968       683          Abarrotes                   Bebidas
## 969       684          Abarrotes                   Bebidas
## 970       686          Abarrotes                   Bebidas
## 971       686          Abarrotes                  Cigarros
## 972       686          Abarrotes                   Bebidas
## 973       686          Abarrotes                   Bebidas
## 974       687          Abarrotes            Pan y Tortilla
## 975       690          Abarrotes                   Bebidas
## 976       690          Abarrotes    Lacteos y Refrigerados
## 977       691          Abarrotes                   Bebidas
## 978       692          Abarrotes                   Botanas
## 979       694          Abarrotes                   Bebidas
## 980       695          Abarrotes                   Bebidas
## 981       697          Abarrotes                  Aderezos
## 982       697          Abarrotes            Pan y Tortilla
## 983       698          Abarrotes                   Bebidas
## 984       698          Abarrotes    Lacteos y Refrigerados
## 985       699          Abarrotes                   Bebidas
## 986       699          Abarrotes                   Bebidas
## 987       701          Abarrotes                   Botanas
## 988       701          Abarrotes                   Bebidas
## 989       702          Abarrotes                   Bebidas
## 990       703          Abarrotes                  Cigarros
## 991       705          Abarrotes    Lacteos y Refrigerados
## 992       705          Abarrotes                   Bebidas
## 993       705          Abarrotes                   Bebidas
## 994       705          Abarrotes         Granos y Semillas
## 995       706          Abarrotes                   Bebidas
## 996       707          Abarrotes                   Bebidas
## 997       708          Abarrotes                   Bebidas
## 998       708          Abarrotes                   Bebidas
## 999       708          Abarrotes            Pan y Tortilla
## 1000      709          Abarrotes                   Bebidas
## 1001      710          Abarrotes                   Bebidas
## 1002      710          Abarrotes                   Bebidas
## 1003      712          Abarrotes                   Bebidas
## 1004      712          Abarrotes                   Bebidas
## 1005      714          Abarrotes                   Latería
## 1006      714          Abarrotes                   Latería
## 1007      715          Abarrotes                   Bebidas
## 1008      715          Abarrotes                   Botanas
## 1009      716          Abarrotes                   Bebidas
## 1010      717          Abarrotes    Lacteos y Refrigerados
## 1011      717          Abarrotes                  Aderezos
## 1012      717          Abarrotes                  Cereales
## 1013      719          Abarrotes                   Bebidas
## 1014      720          Abarrotes                   Bebidas
## 1015      720          Abarrotes                   Bebidas
## 1016      720          Abarrotes                   Bebidas
## 1017      720          Abarrotes                  Cigarros
## 1018      721          Abarrotes                   Botanas
## 1019      721          Abarrotes            Pan y Tortilla
## 1020      724 Bebes e Infantiles                Alimentos 
## 1021      724          Abarrotes                   Bebidas
## 1022      724          Abarrotes                   Bebidas
## 1023      725          Abarrotes                   Cerveza
## 1024      727          Abarrotes                   Bebidas
## 1025      727          Abarrotes        Limpieza del Hogar
## 1026      727          Abarrotes                   Bebidas
## 1027      727          Abarrotes                   Bebidas
## 1028      728          Abarrotes                   Bebidas
## 1029      728          Abarrotes                   Bebidas
## 1030      728          Abarrotes C. Frías y Salchichonería
## 1031      730          Abarrotes      Salsas y Sazonadores
## 1032      730          Abarrotes         Granos y Semillas
## 1033      731          Abarrotes                   Bebidas
## 1034      732          Abarrotes                  Galletas
## 1035      732          Abarrotes                   Bebidas
## 1036      732          Abarrotes                   Bebidas
## 1037      733          Abarrotes        Limpieza del Hogar
## 1038      733          Abarrotes        Limpieza del Hogar
## 1039      734          Abarrotes    Lacteos y Refrigerados
## 1040      734          Abarrotes                   Bebidas
## 1041      735          Abarrotes                   Bebidas
## 1042      735          Abarrotes                   Bebidas
## 1043      735          Abarrotes               Desechables
## 1044      735          Abarrotes               Desechables
## 1045      736          Abarrotes      Salsas y Sazonadores
## 1046      737          Abarrotes                   Bebidas
## 1047      737          Abarrotes                   Bebidas
## 1048      738          Abarrotes                   Bebidas
## 1049      738          Abarrotes            Pan y Tortilla
## 1050      740          Abarrotes            Sopas y Pastas
## 1051      740          Abarrotes    Lacteos y Refrigerados
## 1052      741          Abarrotes            Sopas y Pastas
## 1053      741          Abarrotes        Limpieza del Hogar
## 1054      741          Abarrotes                   Bebidas
## 1055      742          Abarrotes                   Bebidas
## 1056      743          Abarrotes                   Bebidas
## 1057      744          Abarrotes    Lacteos y Refrigerados
## 1058      745          Abarrotes            Sopas y Pastas
## 1059      745          Abarrotes                  Galletas
## 1060      745          Abarrotes                   Bebidas
## 1061      746          Abarrotes                   Botanas
## 1062      746          Abarrotes                   Bebidas
## 1063      748          Abarrotes            Pan y Tortilla
## 1064      748          Abarrotes                   Bebidas
## 1065      749          Abarrotes                  Aderezos
## 1066      749          Abarrotes                   Bebidas
## 1067      750          Abarrotes                   Bebidas
## 1068      751          Abarrotes                  Galletas
## 1069      752          Abarrotes                   Bebidas
## 1070      753          Abarrotes                   Bebidas
## 1071      754          Abarrotes                   Botanas
## 1072      754          Abarrotes            Pan y Tortilla
## 1073      755          Abarrotes                   Bebidas
## 1074      755          Abarrotes                   Bebidas
## 1075      755          Abarrotes                   Bebidas
## 1076      756          Abarrotes                   Bebidas
## 1077      757          Abarrotes                   Bebidas
## 1078      758          Abarrotes                   Bebidas
## 1079      760          Abarrotes                  Galletas
## 1080      760          Abarrotes                   Bebidas
## 1081      761          Abarrotes                   Bebidas
## 1082      761          Abarrotes                   Bebidas
## 1083      762          Abarrotes                   Botanas
## 1084      762          Abarrotes                   Bebidas
## 1085      762          Abarrotes      Salsas y Sazonadores
## 1086      762          Abarrotes                   Bebidas
## 1087      765          Abarrotes                   Bebidas
## 1088      765          Abarrotes                   Bebidas
## 1089      766          Abarrotes                   Bebidas
## 1090      767          Abarrotes                   Cerveza
## 1091      768          Abarrotes                   Botanas
## 1092      768          Abarrotes                   Botanas
## 1093      768          Abarrotes                   Botanas
## 1094      769          Abarrotes                   Bebidas
## 1095      769          Abarrotes      Salsas y Sazonadores
## 1096      770          Abarrotes        Limpieza del Hogar
## 1097      772          Abarrotes                   Bebidas
## 1098      772          Abarrotes                   Bebidas
## 1099      772          Abarrotes                   Bebidas
## 1100      773          Abarrotes                   Botanas
## 1101      773          Abarrotes                   Bebidas
## 1102      774          Abarrotes                   Botanas
## 1103      774          Abarrotes                  Dulcería
## 1104      775          Abarrotes    Harinas y Complementos
## 1105      776          Abarrotes                   Bebidas
## 1106      777          Abarrotes                   Botanas
## 1107      778          Abarrotes                   Bebidas
## 1108      781          Abarrotes                   Bebidas
## 1109      783          Abarrotes            Sopas y Pastas
## 1110      783 Bebes e Infantiles                Alimentos 
## 1111      783          Abarrotes                    Aceite
## 1112      783          Abarrotes            Pan y Tortilla
## 1113      783          Abarrotes                   Bebidas
## 1114      784          Abarrotes                   Botanas
## 1115      784          Abarrotes                  Cigarros
## 1116      786          Abarrotes                   Bebidas
## 1117      787          Abarrotes                   Bebidas
## 1118      787          Abarrotes                   Bebidas
## 1119      788          Abarrotes                   Botanas
## 1120      788          Abarrotes                   Bebidas
## 1121      788          Abarrotes                   Botanas
## 1122      788          Abarrotes                  Cereales
## 1123      788          Abarrotes                   Bebidas
## 1124      789          Abarrotes                   Botanas
## 1125      789          Abarrotes                   Botanas
## 1126      789          Abarrotes                   Bebidas
## 1127      790          Abarrotes                   Botanas
## 1128      792          Abarrotes                   Bebidas
## 1129      792          Abarrotes    Lacteos y Refrigerados
## 1130      792          Abarrotes                   Bebidas
## 1131      794          Abarrotes                   Bebidas
## 1132      794          Abarrotes                   Bebidas
## 1133      796          Abarrotes                   Bebidas
## 1134      797          Abarrotes                   Bebidas
## 1135      798          Abarrotes                   Bebidas
## 1136      800          Abarrotes                   Bebidas
## 1137      801          Abarrotes            Pan y Tortilla
## 1138      803          Abarrotes                   Bebidas
## 1139      803          Abarrotes                  Mantecas
## 1140      806          Abarrotes                   Bebidas
## 1141      806          Abarrotes    Lacteos y Refrigerados
## 1142      807          Abarrotes                   Bebidas
## 1143      809          Abarrotes        Limpieza del Hogar
## 1144      809          Abarrotes                   Bebidas
## 1145      810          Abarrotes            Pan y Tortilla
## 1146      811          Abarrotes                   Bebidas
## 1147      812          Abarrotes   Alimentos para Mascotas
## 1148      812          Abarrotes               Desechables
## 1149      812          Abarrotes                   Bebidas
## 1150      812          Abarrotes               Desechables
## 1151      813          Abarrotes                   Botanas
## 1152      813          Abarrotes                  Especias
## 1153      813          Abarrotes                   Bebidas
## 1154      815          Abarrotes                   Bebidas
## 1155      815          Abarrotes               Desechables
## 1156      815          Abarrotes                  Cigarros
## 1157      816          Abarrotes                   Latería
## 1158      816          Abarrotes                  Galletas
## 1159      817          Abarrotes    Lacteos y Refrigerados
## 1160      817          Abarrotes                   Bebidas
## 1161      818          Abarrotes                   Bebidas
## 1162      818          Abarrotes                   Botanas
## 1163      819          Abarrotes               Desechables
## 1164      822          Abarrotes                   Bebidas
## 1165      823          Abarrotes          Cuidado Personal
## 1166      824          Abarrotes                   Bebidas
## 1167      825          Abarrotes                  Cigarros
## 1168      826          Abarrotes                   Bebidas
## 1169      826          Abarrotes               Desechables
## 1170      827          Abarrotes                   Bebidas
## 1171      828          Abarrotes                   Cerveza
## 1172      831          Abarrotes                   Botanas
## 1173      831          Abarrotes                   Botanas
## 1174      831          Abarrotes                   Botanas
## 1175      831          Abarrotes                   Cerveza
## 1176      832          Abarrotes            Pan y Tortilla
## 1177      833          Abarrotes                   Bebidas
## 1178      834          Abarrotes                   Botanas
## 1179      834          Abarrotes                   Botanas
## 1180      834          Abarrotes                   Botanas
## 1181      834          Abarrotes                   Bebidas
## 1182      835          Abarrotes                   Bebidas
## 1183      837          Abarrotes                   Bebidas
## 1184      837          Abarrotes                   Bebidas
## 1185      838          Abarrotes                   Bebidas
## 1186      839          Abarrotes                   Botanas
## 1187      839          Abarrotes                   Cerveza
## 1188      840          Abarrotes                   Botanas
## 1189      841          Abarrotes                   Botanas
## 1190      841          Abarrotes                  Especias
## 1191      842          Abarrotes                  Galletas
## 1192      842          Abarrotes        Limpieza del Hogar
## 1193      842          Abarrotes            Pan y Tortilla
## 1194      842          Abarrotes        Limpieza del Hogar
## 1195      842          Abarrotes        Limpieza del Hogar
## 1196      842          Abarrotes        Limpieza del Hogar
## 1197      842          Abarrotes                   Bebidas
## 1198      842          Abarrotes        Limpieza del Hogar
## 1199      843          Abarrotes                   Botanas
## 1200      843          Abarrotes                   Bebidas
## 1201      844          Abarrotes                   Bebidas
## 1202      847          Abarrotes                   Bebidas
## 1203      848          Abarrotes                   Bebidas
## 1204      848          Abarrotes               Desechables
## 1205      848          Abarrotes               Desechables
## 1206      849          Abarrotes                   Bebidas
## 1207      850          Abarrotes                   Botanas
## 1208      850          Abarrotes                   Bebidas
## 1209      852          Abarrotes                  Especias
## 1210      852          Abarrotes                   Bebidas
## 1211      853          Abarrotes                   Botanas
## 1212      854          Abarrotes            Sopas y Pastas
## 1213      854          Abarrotes                   Bebidas
## 1214      854          Abarrotes                  Dulcería
## 1215      855          Abarrotes                  Cigarros
## 1216      856          Abarrotes                   Latería
## 1217      856          Abarrotes                  Galletas
## 1218      856          Abarrotes                   Bebidas
## 1219      857          Abarrotes                   Botanas
## 1220      858          Abarrotes                  Especias
## 1221      858          Abarrotes                  Cigarros
## 1222      859          Abarrotes                   Bebidas
## 1223      860          Abarrotes                   Botanas
## 1224      860          Abarrotes        Limpieza del Hogar
## 1225      860          Abarrotes                  Especias
## 1226      862          Abarrotes                   Bebidas
## 1227      863          Abarrotes                  Dulcería
## 1228      863          Abarrotes                   Cerveza
## 1229      864          Abarrotes                   Bebidas
## 1230      866          Abarrotes                   Botanas
## 1231      866          Abarrotes    Lacteos y Refrigerados
## 1232      867          Abarrotes                   Bebidas
## 1233      868          Abarrotes                   Botanas
## 1234      868          Abarrotes                   Bebidas
## 1235      869          Abarrotes                   Bebidas
## 1236      870          Abarrotes                   Bebidas
## 1237      871          Abarrotes                   Bebidas
## 1238      871          Abarrotes                   Botanas
## 1239      872          Abarrotes                   Bebidas
## 1240      872          Abarrotes                   Bebidas
## 1241      873          Abarrotes                   Bebidas
## 1242      873          Abarrotes                  Cigarros
## 1243      873          Abarrotes                   Bebidas
## 1244      874          Abarrotes                   Botanas
## 1245      874          Abarrotes            Sopas y Pastas
## 1246      874          Abarrotes          Cuidado Personal
## 1247      875          Abarrotes                   Botanas
## 1248      875          Abarrotes                   Bebidas
## 1249      876          Abarrotes                   Botanas
## 1250      877          Abarrotes                   Bebidas
## 1251      877          Abarrotes                   Botanas
## 1252      877          Abarrotes             Azúcar y Miel
## 1253      878          Abarrotes                   Bebidas
## 1254      878          Abarrotes        Limpieza del Hogar
## 1255      878          Abarrotes                   Bebidas
## 1256      878          Abarrotes      Salsas y Sazonadores
## 1257      878          Abarrotes               Desechables
## 1258      879          Abarrotes                   Botanas
## 1259      880          Abarrotes               Desechables
## 1260      882          Abarrotes            Pan y Tortilla
## 1261      882          Abarrotes                   Bebidas
## 1262      882         Ferretería                Pegamentos
## 1263      882          Abarrotes         Velas y Veladoras
## 1264      883          Abarrotes                  Cigarros
## 1265      885          Abarrotes                   Botanas
## 1266      885          Abarrotes                   Botanas
## 1267      885          Abarrotes                   Botanas
## 1268      885          Abarrotes                   Botanas
## 1269      885          Abarrotes                   Bebidas
## 1270      886          Abarrotes                   Botanas
## 1271      886          Abarrotes                   Botanas
## 1272      887          Abarrotes                   Bebidas
## 1273      888          Abarrotes            Sopas y Pastas
## 1274      889          Abarrotes                   Bebidas
## 1275      890          Abarrotes                   Bebidas
## 1276      890          Abarrotes                   Botanas
## 1277      891          Abarrotes                   Botanas
## 1278      892          Abarrotes                   Bebidas
## 1279      892          Abarrotes                   Bebidas
## 1280      892          Abarrotes                   Botanas
## 1281      892          Abarrotes    Lacteos y Refrigerados
## 1282      893          Abarrotes                  Cigarros
## 1283      893          Abarrotes            Pan y Tortilla
## 1284      894          Abarrotes    Lacteos y Refrigerados
## 1285      894          Abarrotes                  Cigarros
## 1286      895          Abarrotes                   Botanas
## 1287      896          Abarrotes                   Bebidas
## 1288      897          Abarrotes                  Aderezos
## 1289      897          Abarrotes            Pan y Tortilla
## 1290      897          Abarrotes    Lacteos y Refrigerados
## 1291      898          Abarrotes                   Bebidas
## 1292      899          Abarrotes                  Galletas
## 1293      899          Abarrotes    Harinas y Complementos
## 1294      899          Abarrotes    Lacteos y Refrigerados
## 1295      900          Abarrotes                   Bebidas
## 1296      902          Abarrotes                   Bebidas
## 1297      902          Abarrotes                   Bebidas
## 1298      902          Abarrotes                   Bebidas
## 1299      903          Abarrotes                   Botanas
## 1300      905          Abarrotes                   Bebidas
## 1301      905          Abarrotes                   Bebidas
## 1302      907          Abarrotes                   Bebidas
## 1303      907          Abarrotes                    Aceite
## 1304      907          Abarrotes            Sopas y Pastas
## 1305      908          Abarrotes                   Botanas
## 1306      908          Abarrotes                   Bebidas
## 1307      910          Abarrotes                   Bebidas
## 1308      910          Abarrotes                   Bebidas
## 1309      912          Abarrotes                   Bebidas
## 1310      913          Abarrotes                   Bebidas
## 1311      913          Abarrotes                   Bebidas
## 1312      914          Abarrotes                   Bebidas
## 1313      914          Abarrotes      Salsas y Sazonadores
## 1314      914          Abarrotes            Pan y Tortilla
## 1315      914          Abarrotes            Sopas y Pastas
## 1316      914          Abarrotes                   Bebidas
## 1317      915          Abarrotes                   Bebidas
## 1318      916          Abarrotes            Pan y Tortilla
## 1319      916          Abarrotes                   Bebidas
## 1320      916          Abarrotes                   Bebidas
## 1321      919          Abarrotes                  Mantecas
## 1322      922          Abarrotes                   Bebidas
## 1323      922          Abarrotes                  Cigarros
## 1324      924          Abarrotes                   Botanas
## 1325      924          Abarrotes                   Botanas
## 1326      924          Abarrotes                   Botanas
## 1327      925          Abarrotes                   Latería
## 1328      925          Abarrotes          Cuidado Personal
## 1329      925          Abarrotes         Granos y Semillas
## 1330      927          Abarrotes                  Cigarros
## 1331      927          Abarrotes                   Botanas
## 1332      927          Abarrotes                   Bebidas
## 1333      928          Abarrotes                   Botanas
## 1334      928          Abarrotes                   Bebidas
## 1335      928          Abarrotes                  Cigarros
## 1336      929          Abarrotes                   Bebidas
## 1337      929          Abarrotes                   Bebidas
## 1338      929          Abarrotes                  Galletas
## 1339      929          Abarrotes    Lacteos y Refrigerados
## 1340      930          Abarrotes                  Galletas
## 1341      931          Abarrotes                  Cigarros
## 1342      932          Abarrotes                   Bebidas
## 1343      933          Abarrotes            Sopas y Pastas
## 1344      933          Abarrotes                   Botanas
## 1345      934          Abarrotes                   Bebidas
## 1346      935          Abarrotes                   Bebidas
## 1347      936          Abarrotes               Desechables
## 1348      936          Abarrotes               Desechables
## 1349      937          Abarrotes                   Bebidas
## 1350      937          Abarrotes            Pan y Tortilla
## 1351      937          Abarrotes            Pan y Tortilla
## 1352      938          Abarrotes                   Bebidas
## 1353      938          Abarrotes                   Bebidas
## 1354      938          Abarrotes                   Bebidas
## 1355      939          Abarrotes                  Galletas
## 1356      940          Abarrotes        Limpieza del Hogar
## 1357      940          Abarrotes        Limpieza del Hogar
## 1358      944          Abarrotes                   Bebidas
## 1359      945          Abarrotes                   Bebidas
## 1360      946          Abarrotes                   Bebidas
## 1361      947          Abarrotes                   Botanas
## 1362      948          Abarrotes                   Bebidas
## 1363      949          Abarrotes        Limpieza del Hogar
## 1364      951          Abarrotes                   Bebidas
## 1365      952          Abarrotes                   Bebidas
## 1366      952          Abarrotes                   Bebidas
## 1367      953          Abarrotes                   Bebidas
## 1368      953          Abarrotes            Pan y Tortilla
## 1369      954          Abarrotes                   Botanas
## 1370      954          Abarrotes                   Botanas
## 1371      954          Abarrotes                   Bebidas
## 1372      954          Abarrotes                  Cigarros
## 1373      955          Abarrotes                   Bebidas
## 1374      956          Abarrotes                   Botanas
## 1375      958          Abarrotes                   Bebidas
## 1376      959          Abarrotes                   Bebidas
## 1377      959          Abarrotes            Pan y Tortilla
## 1378      961          Abarrotes                  Galletas
## 1379      961          Abarrotes                   Botanas
## 1380      961          Abarrotes                   Bebidas
## 1381      962          Abarrotes                   Botanas
## 1382      962          Abarrotes        Limpieza del Hogar
## 1383      962          Abarrotes                   Bebidas
## 1384      962          Abarrotes    Lacteos y Refrigerados
## 1385      963          Abarrotes                  Galletas
## 1386      964          Abarrotes        Limpieza del Hogar
## 1387      965          Abarrotes                   Bebidas
## 1388      966          Abarrotes                   Bebidas
## 1389      967          Abarrotes        Limpieza del Hogar
## 1390      967          Abarrotes        Limpieza del Hogar
## 1391      967          Abarrotes                   Bebidas
## 1392      967          Abarrotes        Limpieza del Hogar
## 1393      969          Abarrotes        Limpieza del Hogar
## 1394      969          Abarrotes                   Bebidas
## 1395      969          Abarrotes         Velas y Veladoras
## 1396      970          Abarrotes                   Bebidas
## 1397      972          Abarrotes                   Bebidas
## 1398      972          Abarrotes                   Bebidas
## 1399      973          Abarrotes                   Botanas
## 1400      973          Abarrotes                   Botanas
## 1401      973          Abarrotes                   Bebidas
## 1402      974          Abarrotes                   Bebidas
## 1403      976          Abarrotes                   Bebidas
## 1404      976          Abarrotes                  Dulcería
## 1405      976          Abarrotes                  Dulcería
## 1406      977          Abarrotes            Sopas y Pastas
## 1407      978          Abarrotes            Pan y Tortilla
## 1408      979          Abarrotes    Lacteos y Refrigerados
## 1409      980          Abarrotes                  Galletas
## 1410      980          Abarrotes                   Bebidas
## 1411      980          Abarrotes                   Bebidas
## 1412      981          Abarrotes                  Cigarros
## 1413      982          Abarrotes                   Bebidas
## 1414      983          Abarrotes        Limpieza del Hogar
## 1415      983          Abarrotes                   Bebidas
## 1416      983          Abarrotes                  Dulcería
## 1417      984          Abarrotes                   Bebidas
## 1418      984          Abarrotes                   Bebidas
## 1419      984          Abarrotes                   Bebidas
## 1420      985          Abarrotes                   Botanas
## 1421      985          Abarrotes        Limpieza del Hogar
## 1422      985          Abarrotes    Lacteos y Refrigerados
## 1423      988          Abarrotes                   Bebidas
## 1424      989          Abarrotes                   Bebidas
## 1425      989          Abarrotes                   Bebidas
## 1426      989          Abarrotes                   Bebidas
## 1427      990          Abarrotes            Pan y Tortilla
## 1428      991          Abarrotes             Azúcar y Miel
## 1429      992          Abarrotes                   Botanas
## 1430      992          Abarrotes                   Bebidas
## 1431      993          Abarrotes    Lacteos y Refrigerados
## 1432      993          Abarrotes                   Bebidas
## 1433      994 Bebes e Infantiles                   Pañales
## 1434      995          Abarrotes                  Cigarros
## 1435      996          Abarrotes                  Dulcería
## 1436      997          Abarrotes                   Bebidas
## 1437      998          Abarrotes                   Bebidas
## 1438     1000          Abarrotes                   Bebidas
## 1439     1001          Abarrotes               Desechables
## 1440     1001          Abarrotes               Desechables
## 1441     1002          Abarrotes                  Cigarros
## 1442     1003          Abarrotes                   Bebidas
## 1443     1004          Abarrotes                   Botanas
## 1444     1005          Abarrotes            Pan y Tortilla
## 1445     1005          Abarrotes                  Cigarros
## 1446     1007          Abarrotes                   Bebidas
## 1447     1007          Abarrotes                   Bebidas
## 1448     1007          Abarrotes                  Especias
## 1449     1007          Abarrotes                   Bebidas
## 1450     1007          Abarrotes                   Bebidas
## 1451     1009          Abarrotes                   Bebidas
## 1452     1010          Abarrotes                   Botanas
## 1453     1010          Abarrotes                   Bebidas
## 1454     1012          Abarrotes                  Cigarros
## 1455     1012          Abarrotes                  Galletas
## 1456     1014          Abarrotes                   Botanas
## 1457     1014          Abarrotes                   Bebidas
## 1458     1016          Abarrotes                   Botanas
## 1459     1018          Abarrotes    Lacteos y Refrigerados
## 1460     1019          Abarrotes            Sopas y Pastas
## 1461     1019          Abarrotes        Limpieza del Hogar
## 1462     1019          Abarrotes                  Especias
## 1463     1019          Abarrotes             Azúcar y Miel
## 1464     1020          Abarrotes    Lacteos y Refrigerados
## 1465     1021          Abarrotes                  Especias
## 1466     1021          Abarrotes                   Bebidas
## 1467     1023          Abarrotes                   Bebidas
## 1468     1028          Abarrotes                   Bebidas
## 1469     1029          Abarrotes    Lacteos y Refrigerados
## 1470     1029          Abarrotes                   Bebidas
## 1471     1029          Abarrotes                  Aderezos
## 1472     1029          Abarrotes    Lacteos y Refrigerados
## 1473     1030          Abarrotes                   Bebidas
## 1474     1030          Abarrotes                   Botanas
## 1475     1030          Abarrotes            Pan y Tortilla
## 1476     1030          Abarrotes                   Bebidas
## 1477     1030          Abarrotes                  Cigarros
## 1478     1031          Abarrotes                   Bebidas
## 1479     1031          Abarrotes    Lacteos y Refrigerados
## 1480     1032          Abarrotes                   Latería
## 1481     1033          Abarrotes                  Cigarros
## 1482     1034          Abarrotes          Cuidado Personal
## 1483     1035 Bebes e Infantiles                   Pañales
## 1484     1035          Abarrotes    Lacteos y Refrigerados
## 1485     1035          Abarrotes    Lacteos y Refrigerados
## 1486     1035          Abarrotes        Limpieza del Hogar
## 1487     1036          Abarrotes                   Bebidas
## 1488     1037          Abarrotes                   Botanas
## 1489     1037          Abarrotes   Alimentos para Mascotas
## 1490     1038          Abarrotes                   Botanas
## 1491     1038          Abarrotes                   Bebidas
## 1492     1039          Abarrotes            Pan y Tortilla
## 1493     1039          Abarrotes                   Botanas
## 1494     1039          Abarrotes                   Bebidas
## 1495     1040          Abarrotes                  Galletas
## 1496     1040          Abarrotes                   Bebidas
## 1497     1042          Abarrotes                  Cigarros
## 1498     1042          Abarrotes                   Bebidas
## 1499     1042          Abarrotes                   Bebidas
## 1500     1044          Abarrotes                   Bebidas
## 1501     1045          Abarrotes                   Bebidas
## 1502     1045          Abarrotes                   Bebidas
## 1503     1045          Abarrotes                  Cigarros
## 1504     1046          Abarrotes            Pan y Tortilla
## 1505     1047          Abarrotes                  Cigarros
## 1506     1047          Abarrotes                   Botanas
## 1507     1047          Abarrotes                   Bebidas
## 1508     1049          Abarrotes                   Bebidas
## 1509     1050          Abarrotes                   Botanas
## 1510     1050          Abarrotes    Lacteos y Refrigerados
## 1511     1050          Abarrotes    Lacteos y Refrigerados
## 1512     1050          Abarrotes                   Bebidas
## 1513     1050          Abarrotes                   Bebidas
## 1514     1052          Abarrotes            Pan y Tortilla
## 1515     1052          Abarrotes    Lacteos y Refrigerados
## 1516     1053          Abarrotes                   Bebidas
## 1517     1054          Abarrotes            Pan y Tortilla
## 1518     1055          Abarrotes                   Bebidas
## 1519     1059          Abarrotes                   Bebidas
## 1520     1061          Abarrotes                   Bebidas
## 1521     1062          Abarrotes      Salsas y Sazonadores
## 1522     1063          Abarrotes                   Bebidas
## 1523     1063          Abarrotes         Granos y Semillas
## 1524     1064          Abarrotes                   Bebidas
## 1525     1064          Abarrotes                   Bebidas
## 1526     1065          Abarrotes                   Bebidas
## 1527     1065          Abarrotes                   Cerveza
## 1528     1065          Abarrotes                   Bebidas
## 1529     1065          Abarrotes                  Especias
## 1530     1065          Abarrotes               Desechables
## 1531     1065          Abarrotes               Desechables
## 1532     1066          Abarrotes                   Botanas
## 1533     1066          Abarrotes            Pan y Tortilla
## 1534     1067          Abarrotes                   Botanas
## 1535     1067          Abarrotes                   Latería
## 1536     1067          Abarrotes        Limpieza del Hogar
## 1537     1067          Abarrotes C. Frías y Salchichonería
## 1538     1067          Abarrotes                   Bebidas
## 1539     1067          Abarrotes                   Botanas
## 1540     1067          Abarrotes                   Botanas
## 1541     1067          Abarrotes        Limpieza del Hogar
## 1542     1068          Abarrotes                   Bebidas
## 1543     1070          Abarrotes                   Botanas
## 1544     1071          Abarrotes                   Bebidas
## 1545     1072          Abarrotes                   Bebidas
## 1546     1073          Abarrotes                   Bebidas
## 1547     1074          Abarrotes                  Cigarros
## 1548     1075          Abarrotes                   Bebidas
## 1549     1075          Abarrotes                   Bebidas
## 1550     1076          Abarrotes                   Bebidas
## 1551     1077          Abarrotes          Cuidado Personal
## 1552     1079          Abarrotes          Cuidado Personal
## 1553     1080          Abarrotes            Pan y Tortilla
## 1554     1082          Abarrotes            Pan y Tortilla
## 1555     1083          Abarrotes                   Botanas
## 1556     1083          Abarrotes                   Bebidas
## 1557     1083          Abarrotes            Pan y Tortilla
## 1558     1084          Abarrotes                   Botanas
## 1559     1084          Abarrotes                  Cigarros
## 1560     1085          Abarrotes                   Bebidas
## 1561     1085          Abarrotes                   Botanas
## 1562     1085          Abarrotes                   Bebidas
## 1563     1086          Abarrotes            Sopas y Pastas
## 1564     1086          Abarrotes                   Bebidas
## 1565     1086          Abarrotes                   Bebidas
## 1566     1086          Abarrotes C. Frías y Salchichonería
## 1567     1086          Abarrotes      Salsas y Sazonadores
## 1568     1086          Abarrotes         Granos y Semillas
## 1569     1087          Abarrotes                   Bebidas
## 1570     1088          Abarrotes                   Bebidas
## 1571     1089          Abarrotes        Limpieza del Hogar
## 1572     1089          Abarrotes                   Botanas
## 1573     1089          Abarrotes                   Bebidas
## 1574     1091          Abarrotes                   Bebidas
## 1575     1091          Abarrotes                   Bebidas
## 1576     1092          Abarrotes                   Bebidas
## 1577     1093          Abarrotes                   Bebidas
## 1578     1094          Abarrotes                   Bebidas
## 1579     1094          Abarrotes                  Galletas
## 1580     1094          Abarrotes    Lacteos y Refrigerados
## 1581     1095          Abarrotes                   Bebidas
## 1582     1095          Abarrotes                   Botanas
## 1583     1096          Abarrotes                   Bebidas
## 1584     1097          Abarrotes            Pan y Tortilla
## 1585     1097          Abarrotes    Lacteos y Refrigerados
## 1586     1099          Abarrotes                   Botanas
## 1587     1099          Abarrotes                   Botanas
## 1588     1099          Abarrotes                  Dulcería
## 1589     1100          Abarrotes                   Bebidas
## 1590     1103          Abarrotes        Limpieza del Hogar
## 1591     1103          Abarrotes        Limpieza del Hogar
## 1592     1103          Abarrotes C. Frías y Salchichonería
## 1593     1103          Abarrotes            Pan y Tortilla
## 1594     1103          Abarrotes    Lacteos y Refrigerados
## 1595     1105          Abarrotes                   Bebidas
## 1596     1105          Abarrotes                   Bebidas
## 1597     1106          Abarrotes    Lacteos y Refrigerados
## 1598     1107          Abarrotes                   Bebidas
## 1599     1108          Abarrotes            Pan y Tortilla
## 1600     1109          Abarrotes    Lacteos y Refrigerados
## 1601     1109          Abarrotes            Pan y Tortilla
## 1602     1109          Abarrotes            Pan y Tortilla
## 1603     1109          Abarrotes    Lacteos y Refrigerados
## 1604     1109          Abarrotes                  Galletas
## 1605     1109          Abarrotes                   Bebidas
## 1606     1109          Abarrotes                   Bebidas
## 1607     1109          Abarrotes                   Bebidas
## 1608     1110          Abarrotes                  Galletas
## 1609     1110          Abarrotes                   Bebidas
## 1610     1111          Abarrotes                   Bebidas
## 1611     1111          Abarrotes                   Bebidas
## 1612     1112          Abarrotes                   Bebidas
## 1613     1113          Abarrotes                   Bebidas
## 1614     1114          Abarrotes                   Bebidas
## 1615     1115          Abarrotes                  Cereales
## 1616     1115          Abarrotes                   Bebidas
## 1617     1115          Abarrotes                   Bebidas
## 1618     1117          Abarrotes                   Bebidas
## 1619     1117          Abarrotes                  Cigarros
## 1620     1117          Abarrotes         Granos y Semillas
## 1621     1118          Abarrotes    Lacteos y Refrigerados
## 1622     1119          Abarrotes                  Dulcería
## 1623     1120          Abarrotes               Desechables
## 1624     1121          Abarrotes                   Bebidas
## 1625     1121          Abarrotes                   Bebidas
## 1626     1122          Abarrotes      Te, Chocolate y Café
## 1627     1123          Abarrotes    Lacteos y Refrigerados
## 1628     1125          Abarrotes                   Bebidas
## 1629     1126          Abarrotes    Lacteos y Refrigerados
## 1630     1127          Abarrotes                   Bebidas
## 1631     1128          Abarrotes                   Bebidas
## 1632     1128          Abarrotes            Pan y Tortilla
## 1633     1129          Abarrotes                   Bebidas
## 1634     1130          Abarrotes    Lacteos y Refrigerados
## 1635     1130          Abarrotes                  Dulcería
## 1636     1131          Abarrotes                   Bebidas
## 1637     1132          Abarrotes                   Bebidas
## 1638     1132          Abarrotes        Limpieza del Hogar
## 1639     1132          Abarrotes          Cuidado Personal
## 1640     1133          Abarrotes                   Botanas
## 1641     1133          Abarrotes                  Cigarros
## 1642     1133          Abarrotes                  Cigarros
## 1643     1133          Abarrotes                   Bebidas
## 1644     1135          Abarrotes                   Bebidas
## 1645     1136          Abarrotes                   Bebidas
## 1646     1137          Abarrotes    Lacteos y Refrigerados
## 1647     1137          Abarrotes                   Bebidas
## 1648     1137          Abarrotes             Azúcar y Miel
## 1649     1138          Abarrotes            Pan y Tortilla
## 1650     1140          Abarrotes                  Especias
## 1651     1142          Abarrotes                   Bebidas
## 1652     1142          Abarrotes                   Bebidas
## 1653     1142          Abarrotes                   Bebidas
## 1654     1142          Abarrotes                   Bebidas
## 1655     1143          Abarrotes                   Bebidas
## 1656     1144          Abarrotes                   Bebidas
## 1657     1144          Abarrotes                   Bebidas
## 1658     1145          Abarrotes                  Cigarros
## 1659     1149          Abarrotes                   Bebidas
## 1660     1151          Abarrotes                  Cigarros
## 1661     1152          Abarrotes                   Bebidas
## 1662     1152          Abarrotes                  Cigarros
## 1663     1153          Abarrotes                   Bebidas
## 1664     1153          Abarrotes                   Bebidas
## 1665     1153          Abarrotes               Desechables
## 1666     1154          Abarrotes                   Bebidas
## 1667     1155          Abarrotes                   Bebidas
## 1668     1157          Abarrotes                  Cigarros
## 1669     1157          Abarrotes                  Cigarros
## 1670     1158          Abarrotes                   Bebidas
## 1671     1159          Abarrotes            Pan y Tortilla
## 1672     1159          Abarrotes                   Bebidas
## 1673     1159          Abarrotes                  Cigarros
## 1674     1160          Abarrotes            Sopas y Pastas
## 1675     1160          Abarrotes                   Bebidas
## 1676     1161          Abarrotes                   Bebidas
## 1677     1161          Abarrotes                  Cigarros
## 1678     1163          Abarrotes   Alimentos para Mascotas
## 1679     1166          Abarrotes                  Galletas
## 1680     1166          Abarrotes                   Bebidas
## 1681     1166          Abarrotes                   Bebidas
## 1682     1167          Abarrotes            Pan y Tortilla
## 1683     1168          Abarrotes                   Bebidas
## 1684     1169          Abarrotes                   Bebidas
## 1685     1169          Abarrotes                   Bebidas
## 1686     1170          Abarrotes            Pan y Tortilla
## 1687     1170          Abarrotes                  Cigarros
## 1688     1170          Abarrotes                   Bebidas
## 1689     1171          Abarrotes                   Bebidas
## 1690     1172          Abarrotes         Velas y Veladoras
## 1691     1172          Abarrotes                   Bebidas
## 1692     1172          Abarrotes                   Bebidas
## 1693     1172          Abarrotes         Velas y Veladoras
## 1694     1173          Abarrotes                   Bebidas
## 1695     1174          Abarrotes    Lacteos y Refrigerados
## 1696     1174          Abarrotes                   Bebidas
## 1697     1174          Abarrotes                   Bebidas
## 1698     1174          Abarrotes                   Bebidas
## 1699     1175          Abarrotes                  Dulcería
## 1700     1175          Abarrotes                   Bebidas
## 1701     1176          Abarrotes                   Botanas
## 1702     1176          Abarrotes    Lacteos y Refrigerados
## 1703     1176          Abarrotes                   Bebidas
## 1704     1177          Abarrotes    Lacteos y Refrigerados
## 1705     1178          Abarrotes                  Especias
## 1706     1179          Abarrotes                   Bebidas
## 1707     1180          Abarrotes                   Botanas
## 1708     1180          Abarrotes                   Botanas
## 1709     1180          Abarrotes                   Botanas
## 1710     1180          Abarrotes        Limpieza del Hogar
## 1711     1180          Abarrotes                   Bebidas
## 1712     1180          Abarrotes         Granos y Semillas
## 1713     1181          Abarrotes        Limpieza del Hogar
## 1714     1181 Bebes e Infantiles                Alimentos 
## 1715     1181          Abarrotes        Limpieza del Hogar
## 1716     1181          Abarrotes                   Bebidas
## 1717     1182          Abarrotes                   Bebidas
## 1718     1182          Abarrotes                   Bebidas
## 1719     1183          Abarrotes                   Bebidas
## 1720     1183          Abarrotes                   Bebidas
## 1721     1184          Abarrotes                   Bebidas
## 1722     1185          Abarrotes            Pan y Tortilla
## 1723     1186          Abarrotes                   Bebidas
## 1724     1187          Abarrotes    Lacteos y Refrigerados
## 1725     1188          Abarrotes    Lacteos y Refrigerados
## 1726     1188          Abarrotes                   Bebidas
## 1727     1188          Abarrotes    Harinas y Complementos
## 1728     1188          Abarrotes                   Bebidas
## 1729     1189          Abarrotes    Lacteos y Refrigerados
## 1730     1189          Abarrotes                   Bebidas
## 1731     1190          Abarrotes                   Bebidas
## 1732     1190          Abarrotes                  Dulcería
## 1733     1190          Abarrotes                  Dulcería
## 1734     1192          Abarrotes        Limpieza del Hogar
## 1735     1193          Abarrotes                   Botanas
## 1736     1193          Abarrotes                   Botanas
## 1737     1193          Abarrotes                   Bebidas
## 1738     1194          Abarrotes                  Especias
## 1739     1194          Abarrotes                   Bebidas
## 1740     1195          Abarrotes                   Bebidas
## 1741     1196          Abarrotes                   Bebidas
## 1742     1196          Abarrotes                   Bebidas
## 1743     1196          Abarrotes         Granos y Semillas
## 1744     1197          Abarrotes                  Galletas
## 1745     1197          Abarrotes                   Latería
## 1746     1198          Abarrotes                  Dulcería
## 1747     1199          Abarrotes                   Bebidas
## 1748     1200          Abarrotes      Salsas y Sazonadores
## 1749     1200          Abarrotes        Limpieza del Hogar
## 1750     1200          Abarrotes        Limpieza del Hogar
## 1751     1201          Abarrotes                   Botanas
## 1752     1201          Abarrotes                  Galletas
## 1753     1201          Abarrotes                   Bebidas
## 1754     1202          Abarrotes                   Bebidas
## 1755     1202          Abarrotes         Granos y Semillas
## 1756     1204          Abarrotes                  Cigarros
## 1757     1205          Abarrotes        Limpieza del Hogar
## 1758     1205          Abarrotes        Limpieza del Hogar
## 1759     1205          Abarrotes               Desechables
## 1760     1207          Abarrotes                  Cigarros
## 1761     1209          Abarrotes                   Bebidas
## 1762     1211          Abarrotes                   Botanas
## 1763     1211          Abarrotes        Limpieza del Hogar
## 1764     1211          Abarrotes                   Botanas
## 1765     1211          Abarrotes             Azúcar y Miel
## 1766     1212          Abarrotes                  Galletas
## 1767     1212          Abarrotes                   Botanas
## 1768     1213          Abarrotes                   Bebidas
## 1769     1214          Abarrotes                   Bebidas
## 1770     1215          Abarrotes                   Bebidas
## 1771     1216          Abarrotes    Lacteos y Refrigerados
## 1772     1217          Abarrotes                  Especias
## 1773     1217          Abarrotes                   Bebidas
## 1774     1217          Abarrotes                  Especias
## 1775     1217          Abarrotes                   Bebidas
## 1776     1218          Abarrotes                   Bebidas
## 1777     1219          Abarrotes                   Latería
## 1778     1219          Abarrotes                   Bebidas
## 1779     1220          Abarrotes                   Bebidas
## 1780     1220          Abarrotes                  Especias
## 1781     1221          Abarrotes        Limpieza del Hogar
## 1782     1221          Abarrotes                  Cigarros
## 1783     1221          Abarrotes                   Bebidas
## 1784     1221          Abarrotes                   Bebidas
## 1785     1223          Abarrotes                   Botanas
## 1786     1223          Abarrotes                  Cigarros
## 1787     1224          Abarrotes                   Botanas
## 1788     1224          Abarrotes                  Cereales
## 1789     1224          Abarrotes                  Galletas
## 1790     1224          Abarrotes                   Bebidas
## 1791     1224          Abarrotes                   Bebidas
## 1792     1224          Abarrotes            Pan y Tortilla
## 1793     1224          Abarrotes                  Galletas
## 1794     1225          Abarrotes                   Bebidas
## 1795     1226          Abarrotes            Pan y Tortilla
## 1796     1226          Abarrotes                  Galletas
## 1797     1226          Abarrotes                   Botanas
## 1798     1226          Abarrotes                   Bebidas
## 1799     1227          Abarrotes                   Bebidas
## 1800     1228          Abarrotes                   Bebidas
## 1801     1228          Abarrotes                  Cigarros
## 1802     1230          Abarrotes    Lacteos y Refrigerados
## 1803     1232          Abarrotes            Pan y Tortilla
## 1804     1232          Abarrotes    Lacteos y Refrigerados
## 1805     1234          Abarrotes                   Botanas
## 1806     1234          Abarrotes                   Botanas
## 1807     1234          Abarrotes   Alimentos para Mascotas
## 1808     1235          Abarrotes                   Bebidas
## 1809     1235          Abarrotes          Cuidado Personal
## 1810     1235          Abarrotes                   Bebidas
## 1811     1237          Abarrotes                   Botanas
## 1812     1238          Abarrotes                   Bebidas
## 1813     1239          Abarrotes                   Botanas
## 1814     1241          Abarrotes                   Bebidas
## 1815     1241          Abarrotes            Pan y Tortilla
## 1816     1241          Abarrotes    Lacteos y Refrigerados
## 1817     1242          Abarrotes                   Bebidas
## 1818     1242          Abarrotes                  Cigarros
## 1819     1246          Abarrotes                   Bebidas
## 1820     1246          Abarrotes            Pan y Tortilla
## 1821     1247          Abarrotes        Limpieza del Hogar
## 1822     1247          Abarrotes            Pan y Tortilla
## 1823     1247          Abarrotes        Limpieza del Hogar
## 1824     1247          Abarrotes                   Bebidas
## 1825     1248          Abarrotes                   Bebidas
## 1826     1250          Abarrotes            Pan y Tortilla
## 1827     1250          Abarrotes                  Aderezos
## 1828     1250          Abarrotes                   Bebidas
## 1829     1251          Abarrotes                   Bebidas
## 1830     1251          Abarrotes                  Cigarros
## 1831     1253          Abarrotes                   Bebidas
## 1832     1253          Abarrotes          Cuidado Personal
## 1833     1255          Abarrotes                  Cigarros
## 1834     1256          Abarrotes                   Bebidas
## 1835     1257          Abarrotes                   Bebidas
## 1836     1257          Abarrotes                   Bebidas
## 1837     1257          Abarrotes            Pan y Tortilla
## 1838     1257          Abarrotes                   Botanas
## 1839     1258          Abarrotes                   Botanas
## 1840     1258          Abarrotes                   Botanas
## 1841     1258          Abarrotes                   Bebidas
## 1842     1259          Abarrotes                   Botanas
## 1843     1259          Abarrotes                   Botanas
## 1844     1262          Abarrotes                   Bebidas
## 1845     1263          Abarrotes                   Bebidas
## 1846     1263          Abarrotes                   Bebidas
## 1847     1265          Abarrotes                   Bebidas
## 1848     1265          Abarrotes                   Latería
## 1849     1266          Abarrotes                   Bebidas
## 1850     1266          Abarrotes                   Bebidas
## 1851     1267 Bebes e Infantiles                Alimentos 
## 1852     1268          Abarrotes                   Bebidas
## 1853     1268          Abarrotes                  Galletas
## 1854     1269          Abarrotes            Sopas y Pastas
## 1855     1269          Abarrotes                   Botanas
## 1856     1269          Abarrotes            Sopas y Pastas
## 1857     1269          Abarrotes                   Bebidas
## 1858     1270          Abarrotes            Pan y Tortilla
## 1859     1270          Abarrotes                   Bebidas
## 1860     1271          Abarrotes                   Bebidas
## 1861     1271          Abarrotes                   Botanas
## 1862     1271          Abarrotes                   Bebidas
## 1863     1272          Abarrotes                   Bebidas
## 1864     1272          Abarrotes                   Bebidas
## 1865     1273          Abarrotes                  Cigarros
## 1866     1274          Abarrotes                   Botanas
## 1867     1274          Abarrotes                   Bebidas
## 1868     1274          Abarrotes                   Botanas
## 1869     1275          Abarrotes                   Bebidas
## 1870     1276          Abarrotes    Lacteos y Refrigerados
## 1871     1278          Abarrotes                   Bebidas
## 1872     1278          Abarrotes                   Bebidas
## 1873     1279          Abarrotes                   Bebidas
## 1874     1281          Abarrotes                  Especias
## 1875     1282          Abarrotes            Pan y Tortilla
## 1876     1282          Abarrotes            Sopas y Pastas
## 1877     1282          Abarrotes                   Bebidas
## 1878     1282          Abarrotes                   Bebidas
## 1879     1283          Abarrotes                  Galletas
## 1880     1283          Abarrotes                   Bebidas
## 1881     1283          Abarrotes                   Bebidas
## 1882     1284          Abarrotes                  Mantecas
## 1883     1285          Abarrotes                   Botanas
## 1884     1285          Abarrotes                   Bebidas
## 1885     1286          Abarrotes                   Bebidas
## 1886     1287          Abarrotes                   Bebidas
## 1887     1287          Abarrotes                   Bebidas
## 1888     1288          Abarrotes    Harinas y Complementos
## 1889     1289          Abarrotes                   Bebidas
## 1890     1289          Abarrotes                  Dulcería
## 1891     1289          Abarrotes                   Bebidas
## 1892     1290          Abarrotes                   Bebidas
## 1893     1291          Abarrotes        Limpieza del Hogar
## 1894     1291          Abarrotes                   Bebidas
## 1895     1291          Abarrotes                   Bebidas
## 1896     1292          Abarrotes            Pan y Tortilla
## 1897     1292          Abarrotes                  Aderezos
## 1898     1292          Abarrotes                   Bebidas
## 1899     1293          Abarrotes                   Botanas
## 1900     1293          Abarrotes                   Bebidas
## 1901     1293          Abarrotes                   Bebidas
## 1902     1294          Abarrotes                  Cigarros
## 1903     1295          Abarrotes                   Bebidas
## 1904     1296          Abarrotes                   Bebidas
## 1905     1299          Abarrotes                  Dulcería
## 1906     1300          Abarrotes                   Bebidas
## 1907     1301          Abarrotes            Pan y Tortilla
## 1908     1301          Abarrotes    Lacteos y Refrigerados
## 1909     1302          Abarrotes                  Especias
## 1910     1303          Abarrotes                   Bebidas
## 1911     1304          Abarrotes            Pan y Tortilla
## 1912     1304          Abarrotes                   Bebidas
## 1913     1304          Abarrotes                  Dulcería
## 1914     1304          Abarrotes                   Bebidas
## 1915     1305          Abarrotes                   Botanas
## 1916     1306          Abarrotes    Lacteos y Refrigerados
## 1917     1308          Abarrotes                   Botanas
## 1918     1308          Abarrotes            Pan y Tortilla
## 1919     1308          Abarrotes                   Bebidas
## 1920     1309          Abarrotes                   Bebidas
## 1921     1310          Abarrotes                   Bebidas
## 1922     1311          Abarrotes    Lacteos y Refrigerados
## 1923     1311          Abarrotes                  Cigarros
## 1924     1311          Abarrotes                   Bebidas
## 1925     1312          Abarrotes            Pan y Tortilla
## 1926     1312          Abarrotes                  Cigarros
## 1927     1313          Abarrotes                   Botanas
## 1928     1313          Abarrotes            Pan y Tortilla
## 1929     1313          Abarrotes                   Bebidas
## 1930     1313          Abarrotes                  Cigarros
## 1931     1313          Abarrotes                   Bebidas
## 1932     1314          Abarrotes                  Galletas
## 1933     1314          Abarrotes                  Galletas
## 1934     1315          Abarrotes            Pan y Tortilla
## 1935     1316          Abarrotes                   Bebidas
## 1936     1317          Abarrotes                   Bebidas
## 1937     1318          Abarrotes                   Bebidas
## 1938     1318          Abarrotes        Limpieza del Hogar
## 1939     1318          Abarrotes            Pan y Tortilla
## 1940     1319          Abarrotes            Pan y Tortilla
## 1941     1319          Abarrotes                   Botanas
## 1942     1319          Abarrotes            Pan y Tortilla
## 1943     1319          Abarrotes                   Bebidas
## 1944     1320          Abarrotes                   Botanas
## 1945     1320          Abarrotes                   Botanas
## 1946     1320          Abarrotes                   Botanas
## 1947     1320          Abarrotes                   Botanas
## 1948     1320          Abarrotes                   Botanas
## 1949     1322          Abarrotes                   Bebidas
## 1950     1322          Abarrotes                  Dulcería
## 1951     1323          Abarrotes    Lacteos y Refrigerados
## 1952     1324          Abarrotes            Pan y Tortilla
## 1953     1325          Abarrotes                   Bebidas
## 1954     1326          Abarrotes                   Bebidas
## 1955     1327          Abarrotes                   Botanas
## 1956     1327          Abarrotes                   Bebidas
## 1957     1327          Abarrotes                   Botanas
## 1958     1328          Abarrotes                   Bebidas
## 1959     1330          Abarrotes                  Cigarros
## 1960     1331          Abarrotes                   Bebidas
## 1961     1331          Abarrotes                   Bebidas
## 1962     1332          Abarrotes                   Botanas
## 1963     1332          Abarrotes                   Botanas
## 1964     1332          Abarrotes                   Botanas
## 1965     1332          Abarrotes                   Botanas
## 1966     1332          Abarrotes                   Botanas
## 1967     1332          Abarrotes                   Botanas
## 1968     1333          Abarrotes                   Botanas
## 1969     1333          Abarrotes                   Bebidas
## 1970     1334          Abarrotes                   Bebidas
## 1971     1335          Abarrotes                   Bebidas
## 1972     1335          Abarrotes    Lacteos y Refrigerados
## 1973     1336          Abarrotes    Lacteos y Refrigerados
## 1974     1336          Abarrotes                  Dulcería
## 1975     1337          Abarrotes    Lacteos y Refrigerados
## 1976     1340          Abarrotes                   Bebidas
## 1977     1341          Abarrotes                  Galletas
## 1978     1342          Abarrotes            Pan y Tortilla
## 1979     1342          Abarrotes    Lacteos y Refrigerados
## 1980     1342          Abarrotes                   Bebidas
## 1981     1343          Abarrotes                  Dulcería
## 1982     1343          Abarrotes    Lacteos y Refrigerados
## 1983     1344          Abarrotes    Lacteos y Refrigerados
## 1984     1345          Abarrotes                   Botanas
## 1985     1346          Abarrotes                   Bebidas
## 1986     1346          Abarrotes            Pan y Tortilla
## 1987     1346          Abarrotes                  Cigarros
## 1988     1347          Abarrotes    Lacteos y Refrigerados
## 1989     1347          Abarrotes    Lacteos y Refrigerados
## 1990     1349          Abarrotes    Lacteos y Refrigerados
## 1991     1349          Abarrotes                   Bebidas
## 1992     1349          Abarrotes                   Bebidas
## 1993     1350          Abarrotes                   Bebidas
## 1994     1351          Abarrotes         Velas y Veladoras
## 1995     1351          Abarrotes    Lacteos y Refrigerados
## 1996     1352          Abarrotes                  Dulcería
## 1997     1353          Abarrotes        Limpieza del Hogar
## 1998     1353          Abarrotes                  Cigarros
## 1999     1357          Abarrotes                  Galletas
## 2000     1357          Abarrotes                   Bebidas
## 2001     1357          Abarrotes    Lacteos y Refrigerados
## 2002     1357          Abarrotes                   Bebidas
## 2003     1357          Abarrotes                  Cigarros
## 2004     1358          Abarrotes                   Bebidas
## 2005     1358          Abarrotes                  Dulcería
## 2006     1359          Abarrotes            Pan y Tortilla
## 2007     1360          Abarrotes    Lacteos y Refrigerados
## 2008     1360          Abarrotes             Azúcar y Miel
## 2009     1361          Abarrotes                   Botanas
## 2010     1361          Abarrotes                   Bebidas
## 2011     1362          Abarrotes                   Bebidas
## 2012     1363          Abarrotes                   Bebidas
## 2013     1363          Abarrotes                   Bebidas
## 2014     1364          Abarrotes                   Botanas
## 2015     1364          Abarrotes                   Botanas
## 2016     1364          Abarrotes             Azúcar y Miel
## 2017     1365          Abarrotes                   Bebidas
## 2018     1365          Abarrotes                   Bebidas
## 2019     1367          Abarrotes        Limpieza del Hogar
## 2020     1367          Abarrotes        Limpieza del Hogar
## 2021     1367          Abarrotes        Limpieza del Hogar
## 2022     1367          Abarrotes             Azúcar y Miel
## 2023     1368          Abarrotes                   Bebidas
## 2024     1370          Abarrotes                   Bebidas
## 2025     1370          Abarrotes                   Bebidas
## 2026     1371          Abarrotes                   Bebidas
## 2027     1371          Abarrotes                   Bebidas
## 2028     1372          Abarrotes                   Botanas
## 2029     1373          Abarrotes    Lacteos y Refrigerados
## 2030     1374          Abarrotes                   Botanas
## 2031     1374          Abarrotes            Pan y Tortilla
## 2032     1374          Abarrotes    Lacteos y Refrigerados
## 2033     1375          Abarrotes                   Bebidas
## 2034     1376          Abarrotes                  Galletas
## 2035     1376          Abarrotes                  Galletas
## 2036     1376          Abarrotes    Lacteos y Refrigerados
## 2037     1376          Abarrotes                   Bebidas
## 2038     1376          Abarrotes        Limpieza del Hogar
## 2039     1377          Abarrotes                   Botanas
## 2040     1377          Abarrotes                   Botanas
## 2041     1377          Abarrotes    Lacteos y Refrigerados
## 2042     1378          Abarrotes                   Bebidas
## 2043     1379          Abarrotes                   Bebidas
## 2044     1380          Abarrotes                   Cerveza
## 2045     1383          Abarrotes                   Botanas
## 2046     1383          Abarrotes                   Bebidas
## 2047     1383          Abarrotes                   Bebidas
## 2048     1384          Abarrotes                   Bebidas
## 2049     1384          Abarrotes                   Bebidas
## 2050     1385          Abarrotes                   Bebidas
## 2051     1385          Abarrotes          Cuidado Personal
## 2052     1385          Abarrotes                   Bebidas
## 2053     1385 Bebes e Infantiles      Productos Higiénicos
## 2054     1386          Abarrotes                   Bebidas
## 2055     1386          Abarrotes                   Bebidas
## 2056     1387          Abarrotes                   Bebidas
## 2057     1388          Abarrotes    Lacteos y Refrigerados
## 2058     1388          Abarrotes    Lacteos y Refrigerados
## 2059     1388          Abarrotes    Lacteos y Refrigerados
## 2060     1389          Abarrotes                   Bebidas
## 2061     1389          Abarrotes                   Bebidas
## 2062     1389          Abarrotes                   Bebidas
## 2063     1390          Abarrotes                   Bebidas
## 2064     1391          Abarrotes                   Bebidas
## 2065     1391          Abarrotes                   Bebidas
## 2066     1392          Abarrotes          Cuidado Personal
## 2067     1393          Abarrotes                  Galletas
## 2068     1394          Abarrotes            Pan y Tortilla
## 2069     1395          Abarrotes                   Bebidas
## 2070     1395          Abarrotes                   Bebidas
## 2071     1396          Abarrotes                   Bebidas
## 2072     1396          Abarrotes    Lacteos y Refrigerados
## 2073     1396          Abarrotes                   Bebidas
## 2074     1398          Abarrotes                  Cigarros
## 2075     1399          Abarrotes                   Bebidas
## 2076     1400          Abarrotes                   Bebidas
## 2077     1400          Abarrotes                  Cereales
## 2078     1400          Abarrotes                   Bebidas
## 2079     1402          Abarrotes    Lacteos y Refrigerados
## 2080     1402          Abarrotes        Limpieza del Hogar
## 2081     1402          Abarrotes        Limpieza del Hogar
## 2082     1402          Abarrotes            Pan y Tortilla
## 2083     1402          Abarrotes                   Bebidas
## 2084     1403          Abarrotes                   Bebidas
## 2085     1403          Abarrotes                  Cigarros
## 2086     1404          Abarrotes                   Bebidas
## 2087     1404          Abarrotes                   Bebidas
## 2088     1406          Abarrotes                   Bebidas
## 2089     1408          Abarrotes                   Bebidas
## 2090     1409          Abarrotes                   Bebidas
## 2091     1410          Abarrotes                   Bebidas
## 2092     1410          Abarrotes                   Bebidas
## 2093     1410          Abarrotes                   Bebidas
## 2094     1411          Abarrotes    Lacteos y Refrigerados
## 2095     1411          Abarrotes                   Bebidas
## 2096     1411          Abarrotes                   Bebidas
## 2097     1412          Abarrotes                  Cigarros
## 2098     1413          Abarrotes    Lacteos y Refrigerados
## 2099     1413          Abarrotes                   Bebidas
## 2100     1414          Abarrotes                   Bebidas
## 2101     1414          Abarrotes    Lacteos y Refrigerados
## 2102     1415          Abarrotes        Limpieza del Hogar
## 2103     1416          Abarrotes                   Bebidas
## 2104     1417          Abarrotes                   Botanas
## 2105     1417          Abarrotes                   Bebidas
## 2106     1418          Abarrotes                   Bebidas
## 2107     1419          Abarrotes          Cuidado Personal
## 2108     1419          Abarrotes                   Bebidas
## 2109     1420          Abarrotes                   Bebidas
## 2110     1421          Abarrotes                   Bebidas
## 2111     1422          Abarrotes    Lacteos y Refrigerados
## 2112     1423          Abarrotes                  Galletas
## 2113     1423          Abarrotes                   Bebidas
## 2114     1424          Abarrotes                   Bebidas
## 2115     1425          Abarrotes                   Bebidas
## 2116     1426          Abarrotes                   Bebidas
## 2117     1427          Abarrotes                   Bebidas
## 2118     1427          Abarrotes                  Cigarros
## 2119     1429          Abarrotes        Limpieza del Hogar
## 2120     1429          Abarrotes        Limpieza del Hogar
## 2121     1429          Abarrotes        Limpieza del Hogar
## 2122     1429          Abarrotes        Limpieza del Hogar
## 2123     1429          Abarrotes                   Bebidas
## 2124     1430          Abarrotes                   Bebidas
## 2125     1430          Abarrotes                   Bebidas
## 2126     1431          Abarrotes                   Bebidas
## 2127     1431          Abarrotes    Lacteos y Refrigerados
## 2128     1432          Abarrotes        Limpieza del Hogar
## 2129     1432          Abarrotes      Salsas y Sazonadores
## 2130     1433          Abarrotes                   Bebidas
## 2131     1434          Abarrotes                   Botanas
## 2132     1435          Abarrotes                   Botanas
## 2133     1435          Abarrotes    Lacteos y Refrigerados
## 2134     1436          Abarrotes    Lacteos y Refrigerados
## 2135     1437          Abarrotes                   Bebidas
## 2136     1438          Abarrotes                   Bebidas
## 2137     1439          Abarrotes                   Bebidas
## 2138     1440          Abarrotes                   Botanas
## 2139     1441          Abarrotes                   Bebidas
## 2140     1441          Abarrotes                   Bebidas
## 2141     1442          Abarrotes                   Latería
## 2142     1442          Abarrotes                   Bebidas
## 2143     1443          Abarrotes                   Bebidas
## 2144     1443          Abarrotes                   Bebidas
## 2145     1444          Abarrotes                  Dulcería
## 2146     1445          Abarrotes                  Galletas
## 2147     1445          Abarrotes    Lacteos y Refrigerados
## 2148     1445          Abarrotes    Lacteos y Refrigerados
## 2149     1447          Abarrotes                   Bebidas
## 2150     1447          Abarrotes                   Bebidas
## 2151     1449          Abarrotes                  Galletas
## 2152     1449          Abarrotes    Lacteos y Refrigerados
## 2153     1449          Abarrotes                   Bebidas
## 2154     1450          Abarrotes        Limpieza del Hogar
## 2155     1450          Abarrotes        Limpieza del Hogar
## 2156     1450          Abarrotes                  Aderezos
## 2157     1451          Abarrotes                   Botanas
## 2158     1452          Abarrotes                   Botanas
## 2159     1452          Abarrotes            Pan y Tortilla
## 2160     1452          Abarrotes            Pan y Tortilla
## 2161     1452          Abarrotes                   Bebidas
## 2162     1454          Abarrotes                  Especias
## 2163     1454          Abarrotes      Salsas y Sazonadores
## 2164     1456          Abarrotes                  Cigarros
## 2165     1457          Abarrotes    Lacteos y Refrigerados
## 2166     1457          Abarrotes                   Cerveza
## 2167     1458          Abarrotes        Limpieza del Hogar
## 2168     1458          Abarrotes    Lacteos y Refrigerados
## 2169     1458          Abarrotes                   Bebidas
## 2170     1458          Abarrotes        Limpieza del Hogar
## 2171     1459          Abarrotes                   Bebidas
## 2172     1461          Abarrotes                   Bebidas
## 2173     1461          Abarrotes            Pan y Tortilla
## 2174     1461          Abarrotes                   Botanas
## 2175     1462          Abarrotes        Limpieza del Hogar
## 2176     1462          Abarrotes                  Mantecas
## 2177     1462          Abarrotes                   Bebidas
## 2178     1463          Abarrotes                   Bebidas
## 2179     1463          Abarrotes                   Bebidas
## 2180     1464          Abarrotes    Lacteos y Refrigerados
## 2181     1465          Abarrotes                   Botanas
## 2182     1465          Abarrotes        Limpieza del Hogar
## 2183     1465          Abarrotes                   Botanas
## 2184     1465          Abarrotes                   Bebidas
## 2185     1465          Abarrotes                  Especias
## 2186     1466          Abarrotes            Pan y Tortilla
## 2187     1466          Abarrotes                   Bebidas
## 2188     1467          Abarrotes                   Bebidas
## 2189     1467          Abarrotes                   Bebidas
## 2190     1467          Abarrotes                  Dulcería
## 2191     1468          Abarrotes        Limpieza del Hogar
## 2192     1468          Abarrotes                   Bebidas
## 2193     1468          Abarrotes    Lacteos y Refrigerados
## 2194     1468          Abarrotes                   Bebidas
## 2195     1469          Abarrotes    Harinas y Complementos
## 2196     1470          Abarrotes      Te, Chocolate y Café
## 2197     1471          Abarrotes                   Bebidas
## 2198     1472          Abarrotes                   Bebidas
## 2199     1472          Abarrotes    Lacteos y Refrigerados
## 2200     1472          Abarrotes         Granos y Semillas
## 2201     1473          Abarrotes                   Bebidas
## 2202     1474          Abarrotes          Cuidado Personal
## 2203     1475          Abarrotes         Velas y Veladoras
## 2204     1478          Abarrotes                   Bebidas
## 2205     1478          Abarrotes                   Bebidas
## 2206     1480          Abarrotes                   Botanas
## 2207     1480          Abarrotes                   Botanas
## 2208     1480          Abarrotes                   Bebidas
## 2209     1480          Abarrotes                   Bebidas
## 2210     1481          Abarrotes                   Bebidas
## 2211     1483          Abarrotes        Limpieza del Hogar
## 2212     1483          Abarrotes    Lacteos y Refrigerados
## 2213     1483          Abarrotes        Limpieza del Hogar
## 2214     1483          Abarrotes                   Bebidas
## 2215     1485          Abarrotes                   Bebidas
## 2216     1485          Abarrotes                   Bebidas
## 2217     1486          Abarrotes               Desechables
## 2218     1486          Abarrotes                   Bebidas
## 2219     1486          Abarrotes                   Bebidas
## 2220     1486          Abarrotes                   Bebidas
## 2221     1486          Abarrotes               Desechables
## 2222     1487          Abarrotes                   Bebidas
## 2223     1487          Abarrotes                   Bebidas
## 2224     1488          Abarrotes                   Bebidas
## 2225     1488          Abarrotes                   Bebidas
## 2226     1489          Abarrotes            Pan y Tortilla
## 2227     1489          Abarrotes                   Bebidas
## 2228     1490          Abarrotes    Lacteos y Refrigerados
## 2229     1492          Abarrotes                   Botanas
## 2230     1492          Abarrotes                   Botanas
## 2231     1492          Abarrotes                   Botanas
## 2232     1492          Abarrotes            Sopas y Pastas
## 2233     1492          Abarrotes                   Botanas
## 2234     1492          Abarrotes                   Bebidas
## 2235     1493          Abarrotes                   Latería
## 2236     1494          Abarrotes                   Bebidas
## 2237     1494          Abarrotes                   Bebidas
## 2238     1494          Abarrotes                   Bebidas
## 2239     1495          Abarrotes                  Cigarros
## 2240     1496          Abarrotes                   Bebidas
## 2241     1496          Abarrotes                   Bebidas
## 2242     1497          Abarrotes                   Botanas
## 2243     1497          Abarrotes                   Botanas
## 2244     1497          Abarrotes                   Bebidas
## 2245     1497          Abarrotes                   Bebidas
## 2246     1498          Abarrotes            Pan y Tortilla
## 2247     1498          Abarrotes        Limpieza del Hogar
## 2248     1500          Abarrotes                   Bebidas
## 2249     1501          Abarrotes                   Bebidas
## 2250     1502          Abarrotes          Cuidado Personal
## 2251     1503          Abarrotes                   Bebidas
## 2252     1504          Abarrotes                   Bebidas
## 2253     1504          Abarrotes   Alimentos para Mascotas
## 2254     1504          Abarrotes                  Cigarros
## 2255     1506          Abarrotes                   Latería
## 2256     1507          Abarrotes                   Bebidas
## 2257     1507          Abarrotes                   Bebidas
## 2258     1508          Abarrotes   Alimentos para Mascotas
## 2259     1509          Abarrotes                    Aceite
## 2260     1510          Abarrotes    Lacteos y Refrigerados
## 2261     1511          Abarrotes                   Botanas
## 2262     1511          Abarrotes      Salsas y Sazonadores
## 2263     1511          Abarrotes             Azúcar y Miel
## 2264     1512          Abarrotes            Sopas y Pastas
## 2265     1513          Abarrotes                   Bebidas
## 2266     1513          Abarrotes                   Latería
## 2267     1514          Abarrotes                  Especias
## 2268     1514          Abarrotes      Salsas y Sazonadores
## 2269     1514          Abarrotes                  Especias
## 2270     1514          Abarrotes                  Dulcería
## 2271     1515          Abarrotes               Desechables
## 2272     1516          Abarrotes                   Bebidas
## 2273     1517          Abarrotes                   Bebidas
## 2274     1518          Abarrotes          Cuidado Personal
## 2275     1519          Abarrotes                   Bebidas
## 2276     1519          Abarrotes    Lacteos y Refrigerados
## 2277     1520          Abarrotes                   Latería
## 2278     1522          Abarrotes    Lacteos y Refrigerados
## 2279     1523          Abarrotes    Lacteos y Refrigerados
## 2280     1523          Abarrotes                   Bebidas
## 2281     1524          Abarrotes                   Bebidas
## 2282     1525          Abarrotes                  Galletas
## 2283     1526          Abarrotes            Pan y Tortilla
## 2284     1526          Abarrotes                   Bebidas
## 2285     1526          Abarrotes                   Bebidas
## 2286     1527          Abarrotes                  Cigarros
## 2287     1527          Abarrotes                   Bebidas
## 2288     1529          Abarrotes        Limpieza del Hogar
## 2289     1529          Abarrotes                  Mantecas
## 2290     1530          Abarrotes                   Bebidas
## 2291     1531          Abarrotes                   Botanas
## 2292     1531          Abarrotes                   Botanas
## 2293     1531          Abarrotes                   Bebidas
## 2294     1531          Abarrotes                   Bebidas
## 2295     1532          Abarrotes                   Bebidas
## 2296     1534          Abarrotes                   Bebidas
## 2297     1535          Abarrotes                   Bebidas
## 2298     1535          Abarrotes               Desechables
## 2299     1535          Abarrotes               Desechables
## 2300     1536          Abarrotes        Limpieza del Hogar
## 2301     1536          Abarrotes        Limpieza del Hogar
## 2302     1537          Abarrotes                   Bebidas
## 2303     1538          Abarrotes    Lacteos y Refrigerados
## 2304     1540          Abarrotes            Pan y Tortilla
## 2305     1540          Abarrotes                   Bebidas
## 2306     1541          Abarrotes                   Bebidas
## 2307     1541          Abarrotes                  Especias
## 2308     1542          Abarrotes        Limpieza del Hogar
## 2309     1542          Abarrotes                  Cigarros
## 2310     1542          Abarrotes          Cuidado Personal
## 2311     1543          Abarrotes                   Bebidas
## 2312     1545          Abarrotes                  Galletas
## 2313     1545          Abarrotes                   Bebidas
## 2314     1547          Abarrotes                   Botanas
## 2315     1547          Abarrotes                   Botanas
## 2316     1548          Abarrotes    Lacteos y Refrigerados
## 2317     1548          Abarrotes                  Galletas
## 2318     1550          Abarrotes                   Botanas
## 2319     1550          Abarrotes      Salsas y Sazonadores
## 2320     1551          Abarrotes                   Botanas
## 2321     1551          Abarrotes                   Bebidas
## 2322     1552          Abarrotes                   Bebidas
## 2323     1552          Abarrotes         Granos y Semillas
## 2324     1553          Abarrotes            Sopas y Pastas
## 2325     1553          Abarrotes                   Bebidas
## 2326     1554          Abarrotes                   Bebidas
## 2327     1554          Abarrotes                   Bebidas
## 2328     1556          Abarrotes                   Bebidas
## 2329     1556          Abarrotes                   Bebidas
## 2330     1557          Abarrotes                   Bebidas
## 2331     1558          Abarrotes            Pan y Tortilla
## 2332     1558          Abarrotes                   Bebidas
## 2333     1559          Abarrotes   Alimentos para Mascotas
## 2334     1561          Abarrotes            Sopas y Pastas
## 2335     1562          Abarrotes                   Botanas
## 2336     1563          Abarrotes                  Dulcería
## 2337     1563          Abarrotes                   Botanas
## 2338     1563          Abarrotes                   Bebidas
## 2339     1564          Abarrotes                   Bebidas
## 2340     1567          Abarrotes                   Bebidas
## 2341     1567          Abarrotes                   Bebidas
## 2342     1567          Abarrotes               Desechables
## 2343     1567          Abarrotes               Desechables
## 2344     1568          Abarrotes                   Botanas
## 2345     1568          Abarrotes                   Botanas
## 2346     1569          Abarrotes                   Bebidas
## 2347     1569          Abarrotes                   Bebidas
## 2348     1569          Abarrotes                   Bebidas
## 2349     1571          Abarrotes                   Bebidas
## 2350     1572          Abarrotes                   Bebidas
## 2351     1572          Abarrotes    Lacteos y Refrigerados
## 2352     1572          Abarrotes                   Bebidas
## 2353     1573          Abarrotes      Salsas y Sazonadores
## 2354     1573          Abarrotes                   Bebidas
## 2355     1574          Abarrotes                  Galletas
## 2356     1575          Abarrotes                   Bebidas
## 2357     1575          Abarrotes                  Dulcería
## 2358     1576          Abarrotes                   Botanas
## 2359     1577          Abarrotes                   Bebidas
## 2360     1577          Abarrotes          Cuidado Personal
## 2361     1578          Abarrotes                   Bebidas
## 2362     1579          Abarrotes                   Botanas
## 2363     1579          Abarrotes    Lacteos y Refrigerados
## 2364     1580          Abarrotes                   Botanas
## 2365     1580          Abarrotes                   Botanas
## 2366     1580          Abarrotes                   Botanas
## 2367     1581          Abarrotes                   Bebidas
## 2368     1581          Abarrotes                   Cerveza
## 2369     1584          Abarrotes                   Bebidas
## 2370     1585          Abarrotes                   Bebidas
## 2371     1586          Abarrotes                   Bebidas
## 2372     1586          Abarrotes                   Botanas
## 2373     1586          Abarrotes                   Bebidas
## 2374     1587          Abarrotes    Lacteos y Refrigerados
## 2375     1588          Abarrotes    Lacteos y Refrigerados
## 2376     1588          Abarrotes    Lacteos y Refrigerados
## 2377     1589          Abarrotes                   Botanas
## 2378     1589          Abarrotes                   Bebidas
## 2379     1591          Abarrotes                   Bebidas
## 2380     1593          Abarrotes                   Bebidas
## 2381     1594          Abarrotes                   Botanas
## 2382     1594          Abarrotes                   Bebidas
## 2383     1594          Abarrotes                    Aceite
## 2384     1594          Abarrotes        Limpieza del Hogar
## 2385     1595          Abarrotes            Pan y Tortilla
## 2386     1595          Abarrotes                   Botanas
## 2387     1595          Abarrotes            Pan y Tortilla
## 2388     1596          Abarrotes            Pan y Tortilla
## 2389     1596          Abarrotes                  Galletas
## 2390     1596             Carnes                     Pollo
## 2391     1596          Abarrotes                   Bebidas
## 2392     1599          Abarrotes                  Cigarros
## 2393     1601          Abarrotes                   Bebidas
## 2394     1601          Abarrotes                  Cigarros
## 2395     1601          Abarrotes                   Botanas
## 2396     1604          Abarrotes                   Bebidas
## 2397     1604          Abarrotes                   Bebidas
## 2398     1604          Abarrotes                   Bebidas
## 2399     1605          Abarrotes            Sopas y Pastas
## 2400     1605          Abarrotes            Sopas y Pastas
## 2401     1605          Abarrotes            Pan y Tortilla
## 2402     1606          Abarrotes                  Cigarros
## 2403     1607          Abarrotes                   Bebidas
## 2404     1608          Abarrotes                   Botanas
## 2405     1608          Abarrotes                   Botanas
## 2406     1608          Abarrotes                   Latería
## 2407     1608          Abarrotes                   Bebidas
## 2408     1610          Abarrotes                  Aderezos
## 2409     1610          Abarrotes                   Bebidas
## 2410     1611          Abarrotes                   Botanas
## 2411     1611          Abarrotes                   Botanas
## 2412     1611          Abarrotes                   Bebidas
## 2413     1611          Abarrotes                   Botanas
## 2414     1612          Abarrotes            Sopas y Pastas
## 2415     1612          Abarrotes                   Bebidas
## 2416     1613          Abarrotes                   Botanas
## 2417     1613          Abarrotes                   Botanas
## 2418     1614          Abarrotes                   Botanas
## 2419     1614          Abarrotes                   Botanas
## 2420     1614          Abarrotes            Pan y Tortilla
## 2421     1614          Abarrotes    Lacteos y Refrigerados
## 2422     1615          Abarrotes                   Bebidas
## 2423     1616          Abarrotes                  Dulcería
## 2424     1616          Abarrotes                  Dulcería
## 2425     1619          Abarrotes                   Bebidas
## 2426     1620          Abarrotes                   Botanas
## 2427     1620          Abarrotes                   Bebidas
## 2428     1620          Abarrotes               Desechables
## 2429     1621          Abarrotes            Pan y Tortilla
## 2430     1621          Abarrotes    Lacteos y Refrigerados
## 2431     1621          Abarrotes                   Bebidas
## 2432     1622          Abarrotes                   Bebidas
## 2433     1623          Abarrotes                   Bebidas
## 2434     1623          Abarrotes                   Bebidas
## 2435     1623          Abarrotes                   Bebidas
## 2436     1625          Abarrotes    Harinas y Complementos
## 2437     1626          Abarrotes                  Galletas
## 2438     1626          Abarrotes                  Dulcería
## 2439     1627          Abarrotes                   Bebidas
## 2440     1628          Abarrotes                   Bebidas
## 2441     1628 Bebes e Infantiles                Accesorios
## 2442     1629          Abarrotes                   Botanas
## 2443     1629          Abarrotes    Lacteos y Refrigerados
## 2444     1630          Abarrotes                   Botanas
## 2445     1630          Abarrotes                   Botanas
## 2446     1631          Abarrotes    Harinas y Complementos
## 2447     1631          Abarrotes                   Bebidas
## 2448     1632          Abarrotes                  Galletas
## 2449     1632          Abarrotes      Salsas y Sazonadores
## 2450     1632          Abarrotes    Lacteos y Refrigerados
## 2451     1633          Abarrotes    Lacteos y Refrigerados
## 2452     1633          Abarrotes          Cuidado Personal
## 2453     1633          Abarrotes          Cuidado Personal
## 2454     1633          Abarrotes         Velas y Veladoras
## 2455     1637          Abarrotes                   Bebidas
## 2456     1638          Abarrotes                   Bebidas
## 2457     1638          Abarrotes               Desechables
## 2458     1638          Abarrotes               Desechables
## 2459     1638          Abarrotes                   Bebidas
## 2460     1639          Abarrotes                   Botanas
## 2461     1639          Abarrotes                   Botanas
## 2462     1639          Abarrotes    Lacteos y Refrigerados
## 2463     1639          Abarrotes                   Bebidas
## 2464     1641          Abarrotes            Pan y Tortilla
## 2465     1641          Abarrotes                   Cerveza
## 2466     1642          Abarrotes                  Cigarros
## 2467     1642          Abarrotes    Lacteos y Refrigerados
## 2468     1643          Abarrotes                   Botanas
## 2469     1643          Abarrotes                   Bebidas
## 2470     1643          Abarrotes          Cuidado Personal
## 2471     1644          Abarrotes                   Bebidas
## 2472     1644          Abarrotes                   Botanas
## 2473     1644          Abarrotes         Granos y Semillas
## 2474     1644          Abarrotes             Azúcar y Miel
## 2475     1646          Abarrotes                   Botanas
## 2476     1646          Abarrotes                  Galletas
## 2477     1646          Abarrotes                   Botanas
## 2478     1646          Abarrotes                   Botanas
## 2479     1646          Abarrotes                   Bebidas
## 2480     1646          Abarrotes    Lacteos y Refrigerados
## 2481     1646          Abarrotes                   Botanas
## 2482     1648          Abarrotes                   Bebidas
## 2483     1649          Abarrotes                   Bebidas
## 2484     1650          Abarrotes    Lacteos y Refrigerados
## 2485     1652          Abarrotes            Sopas y Pastas
## 2486     1652          Abarrotes                  Galletas
## 2487     1652          Abarrotes                  Cereales
## 2488     1652          Abarrotes    Lacteos y Refrigerados
## 2489     1652          Abarrotes            Sopas y Pastas
## 2490     1652          Abarrotes                   Bebidas
## 2491     1653          Abarrotes                  Cigarros
## 2492     1654          Abarrotes                   Botanas
## 2493     1655          Abarrotes                   Bebidas
## 2494     1656          Abarrotes      Salsas y Sazonadores
## 2495     1656          Abarrotes                   Bebidas
## 2496     1656          Abarrotes                   Bebidas
## 2497     1657          Abarrotes                  Cereales
## 2498     1657          Abarrotes    Lacteos y Refrigerados
## 2499     1657          Abarrotes          Cuidado Personal
## 2500     1658          Abarrotes    Lacteos y Refrigerados
## 2501     1658          Abarrotes                   Bebidas
## 2502     1659          Abarrotes    Lacteos y Refrigerados
## 2503     1659          Abarrotes                   Bebidas
## 2504     1660          Abarrotes                   Bebidas
## 2505     1661          Abarrotes                   Bebidas
## 2506     1661          Abarrotes                   Bebidas
## 2507     1662          Abarrotes                  Dulcería
## 2508     1662          Abarrotes                   Botanas
## 2509     1662          Abarrotes                   Botanas
## 2510     1662          Abarrotes            Sopas y Pastas
## 2511     1662          Abarrotes                   Botanas
## 2512     1662          Abarrotes                   Botanas
## 2513     1663          Abarrotes                   Bebidas
## 2514     1664          Abarrotes                   Botanas
## 2515     1665          Abarrotes                   Bebidas
## 2516     1666          Abarrotes                   Bebidas
## 2517     1669          Abarrotes         Velas y Veladoras
## 2518     1669          Abarrotes         Velas y Veladoras
## 2519     1669          Abarrotes                   Bebidas
## 2520     1669          Abarrotes    Lacteos y Refrigerados
## 2521     1669          Abarrotes                   Bebidas
## 2522     1669          Abarrotes    Lacteos y Refrigerados
## 2523     1669          Abarrotes                  Cigarros
## 2524     1670          Abarrotes                   Bebidas
## 2525     1670          Abarrotes                   Bebidas
## 2526     1670          Abarrotes                   Bebidas
## 2527     1673          Abarrotes                   Bebidas
## 2528     1675          Abarrotes                   Bebidas
## 2529     1676          Abarrotes                   Bebidas
## 2530     1677          Abarrotes                   Bebidas
## 2531     1677          Abarrotes            Pan y Tortilla
## 2532     1679          Abarrotes                  Cigarros
## 2533     1682          Abarrotes                   Bebidas
## 2534     1682          Abarrotes                    Aceite
## 2535     1683          Abarrotes            Pan y Tortilla
## 2536     1683 Bebes e Infantiles                Alimentos 
## 2537     1683          Abarrotes                   Cerveza
## 2538     1683          Abarrotes                   Bebidas
## 2539     1683          Abarrotes    Lacteos y Refrigerados
## 2540     1686          Abarrotes                   Bebidas
## 2541     1686          Abarrotes                   Bebidas
## 2542     1686          Abarrotes                   Bebidas
## 2543     1686          Abarrotes                   Bebidas
## 2544     1686          Abarrotes                   Bebidas
## 2545     1688          Abarrotes                   Botanas
## 2546     1688          Abarrotes                   Bebidas
## 2547     1688          Abarrotes                   Botanas
## 2548     1688          Abarrotes                   Bebidas
## 2549     1690          Abarrotes                   Botanas
## 2550     1690          Abarrotes                   Bebidas
## 2551     1690          Abarrotes    Lacteos y Refrigerados
## 2552     1690          Abarrotes                   Bebidas
## 2553     1692          Abarrotes                   Bebidas
## 2554     1693          Abarrotes                   Botanas
## 2555     1693          Abarrotes                   Botanas
## 2556     1694          Abarrotes                  Galletas
## 2557     1694          Abarrotes    Lacteos y Refrigerados
## 2558     1695          Abarrotes                   Bebidas
## 2559     1695          Abarrotes                   Cerveza
## 2560     1695          Abarrotes                   Bebidas
## 2561     1696          Abarrotes                   Botanas
## 2562     1696          Abarrotes                  Cereales
## 2563     1696          Abarrotes                   Bebidas
## 2564     1697          Abarrotes        Limpieza del Hogar
## 2565     1697          Abarrotes        Limpieza del Hogar
## 2566     1697          Abarrotes                  Cigarros
## 2567     1697          Abarrotes        Limpieza del Hogar
## 2568     1697          Abarrotes                  Especias
## 2569     1697          Abarrotes        Limpieza del Hogar
## 2570     1698          Abarrotes                   Bebidas
## 2571     1698          Abarrotes    Lacteos y Refrigerados
## 2572     1700          Abarrotes                   Bebidas
## 2573     1702          Abarrotes                  Dulcería
## 2574     1703          Abarrotes      Salsas y Sazonadores
## 2575     1704          Abarrotes                   Bebidas
## 2576     1705          Abarrotes                   Bebidas
## 2577     1705          Abarrotes                   Latería
## 2578     1705          Abarrotes                   Latería
## 2579     1705          Abarrotes                   Bebidas
## 2580     1705          Abarrotes                  Cigarros
## 2581     1706          Abarrotes                  Galletas
## 2582     1708          Abarrotes    Lacteos y Refrigerados
## 2583     1709          Abarrotes                   Botanas
## 2584     1709          Abarrotes                   Botanas
## 2585     1709          Abarrotes                   Bebidas
## 2586     1710          Abarrotes                  Galletas
## 2587     1710          Abarrotes                   Bebidas
## 2588     1711          Abarrotes        Limpieza del Hogar
## 2589     1711          Abarrotes        Limpieza del Hogar
## 2590     1712          Abarrotes                   Bebidas
## 2591     1712          Abarrotes                   Bebidas
## 2592     1714          Abarrotes                  Galletas
## 2593     1714          Abarrotes            Pan y Tortilla
## 2594     1714          Abarrotes                   Bebidas
## 2595     1715          Abarrotes          Cuidado Personal
## 2596     1715          Abarrotes                   Bebidas
## 2597     1716          Abarrotes                   Bebidas
## 2598     1718          Abarrotes                   Bebidas
## 2599     1719          Abarrotes                   Bebidas
## 2600     1719          Abarrotes                   Bebidas
## 2601     1719          Abarrotes                   Bebidas
## 2602     1720          Abarrotes         Velas y Veladoras
## 2603     1720          Abarrotes                   Bebidas
## 2604     1720          Abarrotes                  Especias
## 2605     1720          Abarrotes                   Bebidas
## 2606     1721          Abarrotes        Limpieza del Hogar
## 2607     1722          Abarrotes                   Latería
## 2608     1722          Abarrotes    Lacteos y Refrigerados
## 2609     1723          Abarrotes    Lacteos y Refrigerados
## 2610     1723          Abarrotes            Pan y Tortilla
## 2611     1723          Abarrotes            Pan y Tortilla
## 2612     1723          Abarrotes                   Bebidas
## 2613     1723          Abarrotes                   Bebidas
## 2614     1724          Abarrotes                   Botanas
## 2615     1724          Abarrotes                   Botanas
## 2616     1726          Abarrotes          Cuidado Personal
## 2617     1728          Abarrotes                   Bebidas
## 2618     1730          Abarrotes        Limpieza del Hogar
## 2619     1730          Abarrotes C. Frías y Salchichonería
## 2620     1730          Abarrotes      Salsas y Sazonadores
## 2621     1732          Abarrotes               Desechables
## 2622     1732          Abarrotes    Lacteos y Refrigerados
## 2623     1733          Abarrotes            Pan y Tortilla
## 2624     1733          Abarrotes                   Bebidas
## 2625     1733          Abarrotes                   Bebidas
## 2626     1735          Abarrotes                   Bebidas
## 2627     1735          Abarrotes                   Bebidas
## 2628     1736          Abarrotes        Limpieza del Hogar
## 2629     1736          Abarrotes                   Bebidas
## 2630     1736          Abarrotes                   Bebidas
## 2631     1737          Abarrotes                   Bebidas
## 2632     1737          Abarrotes                   Bebidas
## 2633     1737          Abarrotes               Desechables
## 2634     1737          Abarrotes               Desechables
## 2635     1738          Abarrotes                   Bebidas
## 2636     1738          Abarrotes                   Bebidas
## 2637     1738          Abarrotes                   Bebidas
## 2638     1738          Abarrotes                  Dulcería
## 2639     1739          Abarrotes                   Botanas
## 2640     1739          Abarrotes                   Bebidas
## 2641     1739          Abarrotes                   Bebidas
## 2642     1740          Abarrotes                   Bebidas
## 2643     1741          Abarrotes                   Bebidas
## 2644     1742          Abarrotes                   Bebidas
## 2645     1742          Abarrotes                   Bebidas
## 2646     1743          Abarrotes                   Bebidas
## 2647     1749          Abarrotes                   Latería
## 2648     1750          Abarrotes            Pan y Tortilla
## 2649     1750          Abarrotes            Pan y Tortilla
## 2650     1750          Abarrotes                  Cigarros
## 2651     1750          Abarrotes                   Bebidas
## 2652     1751          Abarrotes                   Bebidas
## 2653     1752          Abarrotes                   Bebidas
## 2654     1753          Abarrotes        Limpieza del Hogar
## 2655     1753          Abarrotes        Limpieza del Hogar
## 2656     1754          Abarrotes            Sopas y Pastas
## 2657     1754          Abarrotes                   Bebidas
## 2658     1754          Abarrotes            Sopas y Pastas
## 2659     1754          Abarrotes            Sopas y Pastas
## 2660     1754          Abarrotes                   Bebidas
## 2661     1755          Abarrotes      Salsas y Sazonadores
## 2662     1755          Abarrotes        Limpieza del Hogar
## 2663     1755          Abarrotes            Pan y Tortilla
## 2664     1755          Abarrotes                  Aderezos
## 2665     1756          Abarrotes                   Bebidas
## 2666     1757          Abarrotes                   Bebidas
## 2667     1757          Abarrotes                  Cigarros
## 2668     1758          Abarrotes                   Bebidas
## 2669     1758          Abarrotes                   Bebidas
## 2670     1759          Abarrotes                   Bebidas
## 2671     1759          Abarrotes         Granos y Semillas
## 2672     1760          Abarrotes      Salsas y Sazonadores
## 2673     1761          Abarrotes                   Botanas
## 2674     1762          Abarrotes         Granos y Semillas
## 2675     1762          Abarrotes                   Bebidas
## 2676     1762          Abarrotes         Granos y Semillas
## 2677     1764          Abarrotes                   Bebidas
## 2678     1765          Abarrotes                   Bebidas
## 2679     1766          Abarrotes                   Bebidas
## 2680     1766          Abarrotes    Lacteos y Refrigerados
## 2681     1768          Abarrotes                   Bebidas
## 2682     1769          Abarrotes                   Bebidas
## 2683     1772          Abarrotes            Pan y Tortilla
## 2684     1772          Abarrotes            Pan y Tortilla
## 2685     1772          Abarrotes    Lacteos y Refrigerados
## 2686     1773          Abarrotes                   Latería
## 2687     1773          Abarrotes                   Bebidas
## 2688     1774          Abarrotes            Pan y Tortilla
## 2689     1775          Abarrotes                  Cigarros
## 2690     1775          Abarrotes      Te, Chocolate y Café
## 2691     1775          Abarrotes                   Bebidas
## 2692     1776          Abarrotes    Lacteos y Refrigerados
## 2693     1777          Abarrotes            Pan y Tortilla
## 2694     1777          Abarrotes            Pan y Tortilla
## 2695     1778          Abarrotes                   Latería
## 2696     1778          Abarrotes      Salsas y Sazonadores
## 2697     1778          Abarrotes      Salsas y Sazonadores
## 2698     1779          Abarrotes                   Bebidas
## 2699     1779          Abarrotes                   Botanas
## 2700     1780          Abarrotes        Limpieza del Hogar
## 2701     1781          Abarrotes                   Bebidas
## 2702     1781          Abarrotes         Granos y Semillas
## 2703     1782          Abarrotes      Salsas y Sazonadores
## 2704     1782          Abarrotes                   Bebidas
## 2705     1783          Abarrotes                   Botanas
## 2706     1783          Abarrotes                   Bebidas
## 2707     1783          Abarrotes                   Bebidas
## 2708     1783          Abarrotes                   Bebidas
## 2709     1784          Abarrotes                   Botanas
## 2710     1784          Abarrotes               Desechables
## 2711     1784          Abarrotes               Desechables
## 2712     1785          Abarrotes                   Bebidas
## 2713     1786          Abarrotes                  Cigarros
## 2714     1786          Abarrotes                  Cigarros
## 2715     1787          Abarrotes                   Latería
## 2716     1787          Abarrotes                   Bebidas
## 2717     1788          Abarrotes                   Botanas
## 2718     1789          Abarrotes                   Botanas
## 2719     1789          Abarrotes                   Bebidas
## 2720     1789          Abarrotes         Granos y Semillas
## 2721     1790          Abarrotes                   Botanas
## 2722     1790          Abarrotes                  Galletas
## 2723     1790          Abarrotes                   Bebidas
## 2724     1791          Abarrotes      Salsas y Sazonadores
## 2725     1793          Abarrotes                   Botanas
## 2726     1794          Abarrotes        Limpieza del Hogar
## 2727     1795          Abarrotes                   Bebidas
## 2728     1796          Abarrotes                   Bebidas
## 2729     1796          Abarrotes                  Dulcería
## 2730     1799          Abarrotes          Cuidado Personal
## 2731     1800          Abarrotes          Cuidado Personal
## 2732     1801          Abarrotes          Cuidado Personal
## 2733     1801          Abarrotes        Limpieza del Hogar
## 2734     1802          Abarrotes            Pan y Tortilla
## 2735     1802          Abarrotes C. Frías y Salchichonería
## 2736     1802          Abarrotes            Pan y Tortilla
## 2737     1802          Abarrotes    Lacteos y Refrigerados
## 2738     1804          Abarrotes                   Botanas
## 2739     1804          Abarrotes                   Bebidas
## 2740     1805          Abarrotes                   Bebidas
## 2741     1805          Abarrotes                   Bebidas
## 2742     1805          Abarrotes         Granos y Semillas
## 2743     1805          Abarrotes                   Botanas
## 2744     1810          Abarrotes                   Botanas
## 2745     1811          Abarrotes                   Bebidas
## 2746     1813          Abarrotes                  Cigarros
## 2747     1813          Abarrotes                   Bebidas
## 2748     1814          Abarrotes                   Botanas
## 2749     1814          Abarrotes      Salsas y Sazonadores
## 2750     1814          Abarrotes                   Bebidas
## 2751     1814          Abarrotes                   Bebidas
## 2752     1814          Abarrotes                   Bebidas
## 2753     1814          Abarrotes                   Bebidas
## 2754     1816          Abarrotes                   Bebidas
## 2755     1816          Abarrotes                   Bebidas
## 2756     1817          Abarrotes                  Especias
## 2757     1818          Abarrotes                  Galletas
## 2758     1820          Abarrotes                   Bebidas
## 2759     1821          Abarrotes                   Bebidas
## 2760     1821          Abarrotes            Pan y Tortilla
## 2761     1821          Abarrotes                   Bebidas
## 2762     1822          Abarrotes                   Bebidas
## 2763     1824          Abarrotes                   Bebidas
## 2764     1827          Abarrotes          Cuidado Personal
## 2765     1828          Abarrotes                   Bebidas
## 2766     1829          Abarrotes                   Bebidas
## 2767     1830          Abarrotes      Salsas y Sazonadores
## 2768     1832          Abarrotes                  Aderezos
## 2769     1832          Abarrotes                   Bebidas
## 2770     1833          Abarrotes                   Bebidas
## 2771     1833          Abarrotes                   Botanas
## 2772     1835          Abarrotes                  Cigarros
## 2773     1835          Abarrotes    Lacteos y Refrigerados
## 2774     1836          Abarrotes                   Latería
## 2775     1836          Abarrotes                   Bebidas
## 2776     1836          Abarrotes      Salsas y Sazonadores
## 2777     1836          Abarrotes      Salsas y Sazonadores
## 2778     1839          Abarrotes                   Bebidas
## 2779     1839          Abarrotes                   Bebidas
## 2780     1840          Abarrotes                   Bebidas
## 2781     1842          Abarrotes                   Bebidas
## 2782     1843          Abarrotes                   Bebidas
## 2783     1844          Abarrotes            Pan y Tortilla
## 2784     1845          Abarrotes                   Bebidas
## 2785     1845          Abarrotes                   Bebidas
## 2786     1845          Abarrotes            Pan y Tortilla
## 2787     1846          Abarrotes                  Cigarros
## 2788     1847          Abarrotes                   Botanas
## 2789     1847          Abarrotes                   Botanas
## 2790     1847          Abarrotes    Lacteos y Refrigerados
## 2791     1848          Abarrotes                   Bebidas
## 2792     1851          Abarrotes        Limpieza del Hogar
## 2793     1851          Abarrotes        Limpieza del Hogar
## 2794     1851          Abarrotes                  Cigarros
## 2795     1852          Abarrotes                   Bebidas
## 2796     1852          Abarrotes            Pan y Tortilla
## 2797     1853          Abarrotes                   Bebidas
## 2798     1853          Abarrotes               Desechables
## 2799     1854          Abarrotes                   Bebidas
## 2800     1854          Abarrotes                   Bebidas
## 2801     1856          Abarrotes                   Bebidas
## 2802     1857          Abarrotes    Lacteos y Refrigerados
## 2803     1858          Abarrotes                   Bebidas
## 2804     1859          Abarrotes                   Bebidas
## 2805     1859          Abarrotes      Salsas y Sazonadores
## 2806     1860          Abarrotes                   Bebidas
## 2807     1861          Abarrotes                   Bebidas
## 2808     1861          Abarrotes                   Bebidas
## 2809     1861          Abarrotes                   Bebidas
## 2810     1862          Abarrotes                   Bebidas
## 2811     1863          Abarrotes C. Frías y Salchichonería
## 2812     1863          Abarrotes                   Bebidas
## 2813     1863          Abarrotes                   Bebidas
## 2814     1865          Abarrotes            Pan y Tortilla
## 2815     1865          Abarrotes                   Bebidas
## 2816     1867          Abarrotes                   Bebidas
## 2817     1867          Abarrotes                   Cerveza
## 2818     1868          Abarrotes                   Bebidas
## 2819     1868          Abarrotes                   Bebidas
## 2820     1868          Abarrotes    Lacteos y Refrigerados
## 2821     1870          Abarrotes                  Galletas
## 2822     1870          Abarrotes    Lacteos y Refrigerados
## 2823     1871          Abarrotes                   Bebidas
## 2824     1874          Abarrotes    Lacteos y Refrigerados
## 2825     1875          Abarrotes                   Botanas
## 2826     1875          Abarrotes            Pan y Tortilla
## 2827     1875          Abarrotes    Lacteos y Refrigerados
## 2828     1875          Abarrotes                   Bebidas
## 2829     1877          Abarrotes                   Bebidas
## 2830     1877          Abarrotes                   Bebidas
## 2831     1878          Abarrotes C. Frías y Salchichonería
## 2832     1878          Abarrotes                   Bebidas
## 2833     1879    Vinos y Licores                   Tequila
## 2834     1879          Abarrotes                   Latería
## 2835     1879          Abarrotes                   Bebidas
## 2836     1879          Abarrotes         Granos y Semillas
## 2837     1880          Abarrotes            Pan y Tortilla
## 2838     1883          Abarrotes                   Bebidas
## 2839     1883          Abarrotes                   Botanas
## 2840     1884          Abarrotes                   Bebidas
## 2841     1884          Abarrotes                  Especias
## 2842     1884          Abarrotes    Lacteos y Refrigerados
## 2843     1885          Abarrotes            Pan y Tortilla
## 2844     1885          Abarrotes            Pan y Tortilla
## 2845     1886          Abarrotes                   Botanas
## 2846     1886          Abarrotes                   Bebidas
## 2847     1886          Abarrotes            Pan y Tortilla
## 2848     1887          Abarrotes C. Frías y Salchichonería
## 2849     1887          Abarrotes                   Bebidas
## 2850     1888          Abarrotes                   Bebidas
## 2851     1889          Abarrotes                   Latería
## 2852     1889          Abarrotes                   Bebidas
## 2853     1889          Abarrotes                   Bebidas
## 2854     1889          Abarrotes                   Bebidas
## 2855     1890          Abarrotes                   Bebidas
## 2856     1893          Abarrotes                   Bebidas
## 2857     1893          Abarrotes                   Bebidas
## 2858     1895          Abarrotes                  Cigarros
## 2859     1895          Abarrotes                   Bebidas
## 2860     1898          Abarrotes                   Bebidas
## 2861     1898          Abarrotes                   Bebidas
## 2862     1900          Abarrotes                   Bebidas
## 2863     1901          Abarrotes                   Bebidas
## 2864     1902          Abarrotes                   Bebidas
## 2865     1903          Abarrotes                   Bebidas
## 2866     1904          Abarrotes                   Bebidas
## 2867     1904          Abarrotes          Cuidado Personal
## 2868     1905          Abarrotes                   Bebidas
## 2869     1905          Abarrotes                  Mantecas
## 2870     1905          Abarrotes                  Dulcería
## 2871     1907          Abarrotes                  Galletas
## 2872     1907          Abarrotes                   Latería
## 2873     1908          Abarrotes    Lacteos y Refrigerados
## 2874     1909          Abarrotes                   Bebidas
## 2875     1911          Abarrotes            Pan y Tortilla
## 2876     1911          Abarrotes                   Bebidas
## 2877     1912          Abarrotes                   Botanas
## 2878     1912          Abarrotes                   Bebidas
## 2879     1912          Abarrotes                  Cigarros
## 2880     1913          Abarrotes            Pan y Tortilla
## 2881     1914 Bebes e Infantiles                Alimentos 
## 2882     1916          Abarrotes                   Botanas
## 2883     1916          Abarrotes                   Botanas
## 2884     1916          Abarrotes                   Botanas
## 2885     1916          Abarrotes                   Bebidas
## 2886     1916          Abarrotes                   Bebidas
## 2887     1916          Abarrotes                   Botanas
## 2888     1918          Abarrotes    Lacteos y Refrigerados
## 2889     1918          Abarrotes            Pan y Tortilla
## 2890     1918          Abarrotes                   Bebidas
## 2891     1919          Abarrotes               Desechables
## 2892     1919          Abarrotes               Desechables
## 2893     1920          Abarrotes                  Galletas
## 2894     1921          Abarrotes                   Botanas
## 2895     1923          Abarrotes                   Bebidas
## 2896     1925          Abarrotes            Pan y Tortilla
## 2897     1925          Abarrotes                   Bebidas
## 2898     1926          Abarrotes                  Cigarros
## 2899     1927          Abarrotes                   Bebidas
## 2900     1929          Abarrotes                   Botanas
## 2901     1929          Abarrotes                  Galletas
## 2902     1929          Abarrotes                  Galletas
## 2903     1929          Abarrotes                   Bebidas
## 2904     1930          Abarrotes                   Botanas
## 2905     1930          Abarrotes                   Botanas
## 2906     1931          Abarrotes                   Bebidas
## 2907     1931          Abarrotes                  Dulcería
## 2908     1931          Abarrotes         Velas y Veladoras
## 2909     1932          Abarrotes                   Bebidas
## 2910     1933          Abarrotes                   Botanas
## 2911     1933          Abarrotes                   Botanas
## 2912     1934          Abarrotes                   Bebidas
## 2913     1935          Abarrotes                   Botanas
## 2914     1935          Abarrotes                   Botanas
## 2915     1936          Abarrotes                   Botanas
## 2916     1936          Abarrotes                   Bebidas
## 2917     1937          Abarrotes         Granos y Semillas
## 2918     1937          Abarrotes                   Botanas
## 2919     1938          Abarrotes                   Botanas
## 2920     1938          Abarrotes                  Galletas
## 2921     1938          Abarrotes                   Botanas
## 2922     1938          Abarrotes                   Bebidas
## 2923     1938          Abarrotes                   Bebidas
## 2924     1939          Abarrotes                   Botanas
## 2925     1939          Abarrotes                   Bebidas
## 2926     1939          Abarrotes                   Bebidas
## 2927     1940          Abarrotes            Pan y Tortilla
## 2928     1940          Abarrotes                  Cigarros
## 2929     1940          Abarrotes                   Bebidas
## 2930     1941          Abarrotes                   Bebidas
## 2931     1942          Abarrotes                   Bebidas
## 2932     1945          Abarrotes            Sopas y Pastas
## 2933     1945          Abarrotes                   Botanas
## 2934     1945          Abarrotes                   Botanas
## 2935     1945          Abarrotes                   Bebidas
## 2936     1947          Abarrotes                   Latería
## 2937     1947          Abarrotes                   Bebidas
## 2938     1947          Abarrotes                   Bebidas
## 2939     1947          Abarrotes                   Bebidas
## 2940     1948          Abarrotes                  Cigarros
## 2941     1949          Abarrotes                   Bebidas
## 2942     1950          Abarrotes                  Cigarros
## 2943     1950          Abarrotes                   Bebidas
## 2944     1951          Abarrotes                   Bebidas
## 2945     1953          Abarrotes                   Bebidas
## 2946     1953          Abarrotes                   Bebidas
## 2947     1953          Abarrotes      Salsas y Sazonadores
## 2948     1953          Abarrotes                  Cigarros
## 2949     1954          Abarrotes                   Bebidas
## 2950     1954          Abarrotes    Lacteos y Refrigerados
## 2951     1955          Abarrotes                  Galletas
## 2952     1955          Abarrotes                  Galletas
## 2953     1955          Abarrotes                   Botanas
## 2954     1955          Abarrotes    Lacteos y Refrigerados
## 2955     1955          Abarrotes    Lacteos y Refrigerados
## 2956     1958          Abarrotes                   Bebidas
## 2957     1959          Abarrotes                   Botanas
## 2958     1959          Abarrotes      Salsas y Sazonadores
## 2959     1959          Abarrotes                   Bebidas
## 2960     1960          Abarrotes                   Botanas
## 2961     1960          Abarrotes                   Bebidas
## 2962     1961          Abarrotes                   Botanas
## 2963     1961          Abarrotes    Lacteos y Refrigerados
## 2964     1961          Abarrotes    Lacteos y Refrigerados
## 2965     1962          Abarrotes                   Botanas
## 2966     1963          Abarrotes                   Bebidas
## 2967     1963          Abarrotes                   Botanas
## 2968     1964          Abarrotes    Lacteos y Refrigerados
## 2969     1967          Abarrotes      Salsas y Sazonadores
## 2970     1967          Abarrotes                   Botanas
## 2971     1967          Abarrotes                   Botanas
## 2972     1967          Abarrotes                   Botanas
## 2973     1967          Abarrotes          Cuidado Personal
## 2974     1969          Abarrotes                   Bebidas
## 2975     1970          Abarrotes    Lacteos y Refrigerados
## 2976     1970          Abarrotes C. Frías y Salchichonería
## 2977     1970          Abarrotes                   Bebidas
## 2978     1975          Abarrotes                   Bebidas
## 2979     1976          Abarrotes                   Bebidas
## 2980     1976          Abarrotes                   Bebidas
## 2981     1977          Abarrotes    Lacteos y Refrigerados
## 2982     1977          Abarrotes    Lacteos y Refrigerados
## 2983     1977          Abarrotes                  Dulcería
## 2984     1977          Abarrotes                   Bebidas
## 2985     1977          Abarrotes    Lacteos y Refrigerados
## 2986     1978          Abarrotes                   Bebidas
## 2987     1980          Abarrotes                   Botanas
## 2988     1980          Abarrotes                   Bebidas
## 2989     1980          Abarrotes                   Bebidas
## 2990     1981          Abarrotes                   Botanas
## 2991     1984          Abarrotes                   Bebidas
## 2992     1984          Abarrotes                  Galletas
## 2993     1984          Abarrotes    Lacteos y Refrigerados
## 2994     1984          Abarrotes                  Cigarros
## 2995     1984          Abarrotes    Lacteos y Refrigerados
## 2996     1985          Abarrotes                   Latería
## 2997     1985          Abarrotes                   Bebidas
## 2998     1987          Abarrotes            Pan y Tortilla
## 2999     1987          Abarrotes            Pan y Tortilla
## 3000     1987          Abarrotes    Lacteos y Refrigerados
## 3001     1987          Abarrotes                   Bebidas
## 3002     1990          Abarrotes        Limpieza del Hogar
## 3003     1990          Abarrotes          Cuidado Personal
## 3004     1992          Abarrotes                   Bebidas
## 3005     1994          Abarrotes                   Botanas
## 3006     1994          Abarrotes                   Botanas
## 3007     1994          Abarrotes    Lacteos y Refrigerados
## 3008     1994          Abarrotes         Granos y Semillas
## 3009     1995          Abarrotes                   Bebidas
## 3010     1995          Abarrotes         Velas y Veladoras
## 3011     1995          Abarrotes            Pan y Tortilla
## 3012     1995          Abarrotes            Pan y Tortilla
## 3013     1997          Abarrotes                   Bebidas
## 3014     1997          Abarrotes                   Cerveza
## 3015     1998          Abarrotes            Pan y Tortilla
## 3016     1998          Abarrotes            Pan y Tortilla
## 3017     1998          Abarrotes                   Botanas
## 3018     1998          Abarrotes                   Bebidas
## 3019     1999          Abarrotes                   Bebidas
## 3020     1999          Abarrotes    Lacteos y Refrigerados
## 3021     2000          Abarrotes                   Bebidas
## 3022     2000          Abarrotes    Lacteos y Refrigerados
## 3023     2000          Abarrotes                   Latería
## 3024     2000          Abarrotes                  Cigarros
## 3025     2001          Abarrotes                   Bebidas
## 3026     2002          Abarrotes                  Cigarros
## 3027     2003          Abarrotes    Lacteos y Refrigerados
## 3028     2004          Abarrotes            Pan y Tortilla
## 3029     2005          Abarrotes                   Bebidas
## 3030     2007          Abarrotes                   Bebidas
## 3031     2007          Abarrotes            Pan y Tortilla
## 3032     2007          Abarrotes                  Cigarros
## 3033     2007          Abarrotes                  Dulcería
## 3034     2007          Abarrotes                   Bebidas
## 3035     2008          Abarrotes    Lacteos y Refrigerados
## 3036     2008          Abarrotes                   Latería
## 3037     2009 Bebes e Infantiles      Productos Higiénicos
## 3038     2010          Abarrotes                   Bebidas
## 3039     2010          Abarrotes                   Bebidas
## 3040     2011          Abarrotes                   Bebidas
## 3041     2011          Abarrotes                   Bebidas
## 3042     2012          Abarrotes                   Bebidas
## 3043     2012          Abarrotes        Limpieza del Hogar
## 3044     2012          Abarrotes                   Bebidas
## 3045     2013          Abarrotes                  Cigarros
## 3046     2014          Abarrotes                   Bebidas
## 3047     2014          Abarrotes                   Bebidas
## 3048     2014          Abarrotes         Granos y Semillas
## 3049     2016          Abarrotes                   Postres
## 3050     2017          Abarrotes                  Especias
## 3051     2017          Abarrotes                   Botanas
## 3052     2017          Abarrotes                  Dulcería
## 3053     2019          Abarrotes                   Bebidas
## 3054     2020          Abarrotes                   Bebidas
## 3055     2020          Abarrotes                   Latería
## 3056     2020          Abarrotes                   Bebidas
## 3057     2021          Abarrotes                  Cigarros
## 3058     2021          Abarrotes                   Bebidas
## 3059     2022          Abarrotes                   Botanas
## 3060     2023          Abarrotes                   Botanas
## 3061     2023          Abarrotes                   Cerveza
## 3062     2023          Abarrotes                   Bebidas
## 3063     2023          Abarrotes                   Bebidas
## 3064     2024          Abarrotes         Velas y Veladoras
## 3065     2025          Abarrotes            Pan y Tortilla
## 3066     2027          Abarrotes         Velas y Veladoras
## 3067     2028          Abarrotes                   Bebidas
## 3068     2028          Abarrotes            Pan y Tortilla
## 3069     2030          Abarrotes                  Cigarros
## 3070     2030          Abarrotes                   Botanas
## 3071     2030          Abarrotes         Granos y Semillas
## 3072     2033          Abarrotes                   Bebidas
## 3073     2033          Abarrotes    Lacteos y Refrigerados
## 3074     2034          Abarrotes                   Bebidas
## 3075     2035          Abarrotes    Lacteos y Refrigerados
## 3076     2036          Abarrotes                   Bebidas
## 3077     2036          Abarrotes    Lacteos y Refrigerados
## 3078     2036          Abarrotes                   Bebidas
## 3079     2036          Abarrotes                   Bebidas
## 3080     2038          Abarrotes                  Dulcería
## 3081     2040          Abarrotes                   Botanas
## 3082     2040          Abarrotes            Pan y Tortilla
## 3083     2040          Abarrotes                   Botanas
## 3084     2040          Abarrotes                  Galletas
## 3085     2040          Abarrotes                   Bebidas
## 3086     2040         Ferretería                Pegamentos
## 3087     2041          Abarrotes                   Botanas
## 3088     2041          Abarrotes                   Botanas
## 3089     2041          Abarrotes                   Botanas
## 3090     2041          Abarrotes                   Bebidas
## 3091     2042          Abarrotes                   Botanas
## 3092     2045          Abarrotes                   Bebidas
## 3093     2046          Abarrotes                   Bebidas
## 3094     2046          Abarrotes                   Bebidas
## 3095     2047          Abarrotes                   Bebidas
## 3096     2049          Abarrotes                  Dulcería
## 3097     2050          Abarrotes                   Bebidas
## 3098     2051          Abarrotes            Pan y Tortilla
## 3099     2052          Abarrotes                   Bebidas
## 3100     2054          Abarrotes    Lacteos y Refrigerados
## 3101     2056          Abarrotes                   Bebidas
## 3102     2057          Abarrotes                  Galletas
## 3103     2057          Abarrotes                   Botanas
## 3104     2057          Abarrotes                  Cigarros
## 3105     2057          Abarrotes          Cuidado Personal
## 3106     2058          Abarrotes            Pan y Tortilla
## 3107     2058          Abarrotes                   Bebidas
## 3108     2059          Abarrotes                   Botanas
## 3109     2059          Abarrotes                   Botanas
## 3110     2059          Abarrotes                   Botanas
## 3111     2060          Abarrotes                   Botanas
## 3112     2060          Abarrotes                   Botanas
## 3113     2064          Abarrotes            Sopas y Pastas
## 3114     2064          Abarrotes                   Bebidas
## 3115     2065          Abarrotes                  Dulcería
## 3116     2066          Abarrotes                   Bebidas
## 3117     2066          Abarrotes                  Galletas
## 3118     2066          Abarrotes    Lacteos y Refrigerados
## 3119     2067          Abarrotes                  Cigarros
## 3120     2067          Abarrotes                  Galletas
## 3121     2068          Abarrotes                  Cigarros
## 3122     2068          Abarrotes                  Cigarros
## 3123     2068          Abarrotes                   Bebidas
## 3124     2068          Abarrotes                   Botanas
## 3125     2068          Abarrotes                   Bebidas
## 3126     2069          Abarrotes                   Botanas
## 3127     2070          Abarrotes                   Botanas
## 3128     2070          Abarrotes                   Bebidas
## 3129     2071          Abarrotes                   Botanas
## 3130     2072          Abarrotes    Lacteos y Refrigerados
## 3131     2073          Abarrotes                  Cigarros
## 3132     2075          Abarrotes            Pan y Tortilla
## 3133     2075          Abarrotes                   Botanas
## 3134     2075          Abarrotes                  Galletas
## 3135     2077          Abarrotes                  Galletas
## 3136     2078          Abarrotes                   Botanas
## 3137     2079          Abarrotes                   Botanas
## 3138     2079          Abarrotes                   Botanas
## 3139     2079          Abarrotes    Lacteos y Refrigerados
## 3140     2079          Abarrotes                   Bebidas
## 3141     2080          Abarrotes                   Bebidas
## 3142     2080          Abarrotes    Lacteos y Refrigerados
## 3143     2080          Abarrotes                   Bebidas
## 3144     2080          Abarrotes                   Bebidas
## 3145     2081          Abarrotes                   Botanas
## 3146     2081          Abarrotes                  Cigarros
## 3147     2082          Abarrotes                   Botanas
## 3148     2082          Abarrotes                   Botanas
## 3149     2082          Abarrotes                   Botanas
## 3150     2082          Abarrotes                    Aceite
## 3151     2085          Abarrotes                   Botanas
## 3152     2085          Abarrotes                   Botanas
## 3153     2085          Abarrotes                   Botanas
## 3154     2086          Abarrotes    Lacteos y Refrigerados
## 3155     2087 Bebes e Infantiles                Alimentos 
## 3156     2087           Farmacia      Material de Curación
## 3157     2088          Abarrotes            Pan y Tortilla
## 3158     2088          Abarrotes            Pan y Tortilla
## 3159     2091          Abarrotes                  Dulcería
## 3160     2091          Abarrotes                   Bebidas
## 3161     2093          Abarrotes            Pan y Tortilla
## 3162     2093          Abarrotes                   Bebidas
## 3163     2095          Abarrotes                   Bebidas
## 3164     2097          Abarrotes                   Bebidas
## 3165     2097          Abarrotes                   Bebidas
## 3166     2102          Abarrotes            Pan y Tortilla
## 3167     2102          Abarrotes            Pan y Tortilla
## 3168     2102          Abarrotes                   Bebidas
## 3169     2102          Abarrotes            Pan y Tortilla
## 3170     2103          Abarrotes                   Bebidas
## 3171     2103          Abarrotes          Cuidado Personal
## 3172     2105          Abarrotes            Pan y Tortilla
## 3173     2105          Abarrotes                   Bebidas
## 3174     2106          Abarrotes                  Dulcería
## 3175     2106          Abarrotes          Cuidado Personal
## 3176     2108          Abarrotes               Desechables
## 3177     2109          Abarrotes                   Bebidas
## 3178     2109          Abarrotes                   Bebidas
## 3179     2111          Abarrotes    Lacteos y Refrigerados
## 3180     2111          Abarrotes            Pan y Tortilla
## 3181     2112          Abarrotes    Lacteos y Refrigerados
## 3182     2114          Abarrotes                   Bebidas
## 3183     2114          Abarrotes                   Bebidas
## 3184     2118          Abarrotes                   Bebidas
## 3185     2119          Abarrotes                  Galletas
## 3186     2119          Abarrotes    Lacteos y Refrigerados
## 3187     2119          Abarrotes                   Bebidas
## 3188     2120          Abarrotes    Lacteos y Refrigerados
## 3189     2121          Abarrotes                   Bebidas
## 3190     2122          Abarrotes                  Cigarros
## 3191     2124          Abarrotes                   Bebidas
## 3192     2124          Abarrotes                   Bebidas
## 3193     2126          Abarrotes                   Botanas
## 3194     2127          Abarrotes                   Bebidas
## 3195     2127 Bebes e Infantiles                Alimentos 
## 3196     2128          Abarrotes                   Bebidas
## 3197     2128          Abarrotes                   Bebidas
## 3198     2129          Abarrotes                   Bebidas
## 3199     2132          Abarrotes                   Bebidas
## 3200     2134         Ferretería                Pegamentos
## 3201     2136          Abarrotes                   Bebidas
## 3202     2137          Abarrotes             Azúcar y Miel
## 3203     2138          Abarrotes        Limpieza del Hogar
## 3204     2138          Abarrotes                   Bebidas
## 3205     2138          Abarrotes        Limpieza del Hogar
## 3206     2138          Abarrotes                  Cigarros
## 3207     2139          Abarrotes                   Bebidas
## 3208     2140          Abarrotes    Lacteos y Refrigerados
## 3209     2141          Abarrotes                   Bebidas
## 3210     2141          Abarrotes                   Bebidas
## 3211     2143          Abarrotes                   Bebidas
## 3212     2143          Abarrotes                   Bebidas
## 3213     2144          Abarrotes    Lacteos y Refrigerados
## 3214     2144          Abarrotes            Pan y Tortilla
## 3215     2144          Abarrotes                  Especias
## 3216     2144          Abarrotes                   Bebidas
## 3217     2145          Abarrotes                   Bebidas
## 3218     2145          Abarrotes            Pan y Tortilla
## 3219     2145          Abarrotes                   Bebidas
## 3220     2145          Abarrotes      Salsas y Sazonadores
## 3221     2146          Abarrotes        Limpieza del Hogar
## 3222     2147          Abarrotes                   Bebidas
## 3223     2148          Abarrotes                   Bebidas
## 3224     2148          Abarrotes                   Bebidas
## 3225     2149          Abarrotes                   Bebidas
## 3226     2150          Abarrotes                   Bebidas
## 3227     2150          Abarrotes                  Especias
## 3228     2151          Abarrotes            Pan y Tortilla
## 3229     2151          Abarrotes                   Bebidas
## 3230     2151          Abarrotes                   Bebidas
## 3231     2152          Abarrotes                   Botanas
## 3232     2152          Abarrotes    Lacteos y Refrigerados
## 3233     2152          Abarrotes                   Bebidas
## 3234     2153          Abarrotes         Velas y Veladoras
## 3235     2154          Abarrotes      Salsas y Sazonadores
## 3236     2154          Abarrotes                   Bebidas
## 3237     2155          Abarrotes                   Bebidas
## 3238     2156          Abarrotes                   Botanas
## 3239     2158          Abarrotes                   Bebidas
## 3240     2159          Abarrotes                   Bebidas
## 3241     2159          Abarrotes                  Galletas
## 3242     2159          Abarrotes                  Galletas
## 3243     2159          Abarrotes      Salsas y Sazonadores
## 3244     2159          Abarrotes                   Bebidas
## 3245     2159          Abarrotes                   Bebidas
## 3246     2159          Abarrotes                   Latería
## 3247     2159          Abarrotes         Granos y Semillas
## 3248     2160          Abarrotes            Pan y Tortilla
## 3249     2160          Abarrotes        Limpieza del Hogar
## 3250     2160          Abarrotes             Azúcar y Miel
## 3251     2162          Abarrotes      Salsas y Sazonadores
## 3252     2163          Abarrotes    Lacteos y Refrigerados
## 3253     2165          Abarrotes                   Bebidas
## 3254     2165          Abarrotes                   Bebidas
## 3255     2165          Abarrotes            Pan y Tortilla
## 3256     2167          Abarrotes                   Bebidas
## 3257     2167          Abarrotes                   Bebidas
## 3258     2168          Abarrotes        Limpieza del Hogar
## 3259     2168          Abarrotes                    Aceite
## 3260     2169          Abarrotes    Lacteos y Refrigerados
## 3261     2171          Abarrotes                   Bebidas
## 3262     2172          Abarrotes                  Galletas
## 3263     2172          Abarrotes                   Bebidas
## 3264     2172          Abarrotes                   Bebidas
## 3265     2172          Abarrotes                   Bebidas
## 3266     2174          Abarrotes                   Botanas
## 3267     2174          Abarrotes    Lacteos y Refrigerados
## 3268     2174          Abarrotes            Sopas y Pastas
## 3269     2174          Abarrotes                   Bebidas
## 3270     2175          Abarrotes        Limpieza del Hogar
## 3271     2176          Abarrotes                   Botanas
## 3272     2176          Abarrotes                   Botanas
## 3273     2176          Abarrotes                   Botanas
## 3274     2176          Abarrotes                   Bebidas
## 3275     2177          Abarrotes        Limpieza del Hogar
## 3276     2177          Abarrotes                   Bebidas
## 3277     2178          Abarrotes                   Bebidas
## 3278     2180          Abarrotes                   Botanas
## 3279     2180          Abarrotes                   Botanas
## 3280     2180          Abarrotes                   Bebidas
## 3281     2180          Abarrotes                   Bebidas
## 3282     2180          Abarrotes                   Bebidas
## 3283     2181          Abarrotes            Pan y Tortilla
## 3284     2181          Abarrotes                   Bebidas
## 3285     2181          Abarrotes                   Bebidas
## 3286     2181          Abarrotes        Limpieza del Hogar
## 3287     2182          Abarrotes                   Botanas
## 3288     2182          Abarrotes                   Bebidas
## 3289     2182          Abarrotes                   Bebidas
## 3290     2183          Abarrotes                   Botanas
## 3291     2184          Abarrotes                   Bebidas
## 3292     2185          Abarrotes                   Bebidas
## 3293     2188          Abarrotes                   Bebidas
## 3294     2188          Abarrotes            Pan y Tortilla
## 3295     2188          Abarrotes                   Bebidas
## 3296     2190          Abarrotes                   Botanas
## 3297     2190          Abarrotes                   Bebidas
## 3298     2190          Abarrotes                   Bebidas
## 3299     2191          Abarrotes    Lacteos y Refrigerados
## 3300     2192          Abarrotes                  Especias
## 3301     2193          Abarrotes    Lacteos y Refrigerados
## 3302     2194          Abarrotes            Pan y Tortilla
## 3303     2194          Abarrotes    Lacteos y Refrigerados
## 3304     2195          Abarrotes                  Cereales
## 3305     2195          Abarrotes                   Bebidas
## 3306     2195          Abarrotes                   Bebidas
## 3307     2197          Abarrotes                  Galletas
## 3308     2197          Abarrotes                   Botanas
## 3309     2199          Abarrotes                   Bebidas
## 3310     2200 Bebes e Infantiles                Alimentos 
## 3311     2201          Abarrotes        Limpieza del Hogar
## 3312     2202          Abarrotes                   Bebidas
## 3313     2203          Abarrotes                  Especias
## 3314     2205          Abarrotes                   Bebidas
## 3315     2205          Abarrotes                   Bebidas
## 3316     2205          Abarrotes    Lacteos y Refrigerados
## 3317     2205          Abarrotes                   Bebidas
## 3318     2206          Abarrotes        Limpieza del Hogar
## 3319     2206          Abarrotes        Limpieza del Hogar
## 3320     2207          Abarrotes                   Bebidas
## 3321     2208          Abarrotes                   Botanas
## 3322     2209          Abarrotes                  Especias
## 3323     2211          Abarrotes                   Bebidas
## 3324     2212          Abarrotes                  Galletas
## 3325     2212          Abarrotes                   Bebidas
## 3326     2212          Abarrotes                   Bebidas
## 3327     2213          Abarrotes                   Botanas
## 3328     2214          Abarrotes                   Botanas
## 3329     2215          Abarrotes                   Bebidas
## 3330     2215          Abarrotes                   Botanas
## 3331     2215          Abarrotes    Lacteos y Refrigerados
## 3332     2215          Abarrotes                   Bebidas
## 3333     2217          Abarrotes            Sopas y Pastas
## 3334     2217          Abarrotes                   Bebidas
## 3335     2218          Abarrotes        Limpieza del Hogar
## 3336     2218          Abarrotes            Pan y Tortilla
## 3337     2219          Abarrotes                   Botanas
## 3338     2220          Abarrotes                   Bebidas
## 3339     2221          Abarrotes    Lacteos y Refrigerados
## 3340     2222          Abarrotes                   Bebidas
## 3341     2224          Abarrotes            Sopas y Pastas
## 3342     2224          Abarrotes                   Bebidas
## 3343     2225          Abarrotes                   Bebidas
## 3344     2225          Abarrotes C. Frías y Salchichonería
## 3345     2226          Abarrotes    Lacteos y Refrigerados
## 3346     2227          Abarrotes    Lacteos y Refrigerados
## 3347     2227          Abarrotes C. Frías y Salchichonería
## 3348     2227          Abarrotes                   Bebidas
## 3349     2229          Abarrotes                   Bebidas
## 3350     2232          Abarrotes    Lacteos y Refrigerados
## 3351     2233          Abarrotes                   Bebidas
## 3352     2233          Abarrotes                  Dulcería
## 3353     2234          Abarrotes         Velas y Veladoras
## 3354     2237          Abarrotes                   Bebidas
## 3355     2238          Abarrotes                   Bebidas
## 3356     2239          Abarrotes                   Bebidas
## 3357     2239          Abarrotes                   Bebidas
## 3358     2240          Abarrotes                  Especias
## 3359     2240          Abarrotes                   Bebidas
## 3360     2241          Abarrotes                   Bebidas
## 3361     2241          Abarrotes                  Cigarros
## 3362     2241          Abarrotes                   Latería
## 3363     2243          Abarrotes            Pan y Tortilla
## 3364     2243          Abarrotes                  Galletas
## 3365     2243          Abarrotes                   Botanas
## 3366     2244          Abarrotes          Cuidado Personal
## 3367     2245          Abarrotes                   Botanas
## 3368     2245          Abarrotes                   Bebidas
## 3369     2246          Abarrotes                  Dulcería
## 3370     2247          Abarrotes                   Bebidas
## 3371     2247          Abarrotes         Granos y Semillas
## 3372     2248          Abarrotes                   Botanas
## 3373     2250          Abarrotes                  Cigarros
## 3374     2251          Abarrotes                   Bebidas
## 3375     2252          Abarrotes               Desechables
## 3376     2252          Abarrotes         Granos y Semillas
## 3377     2253          Abarrotes                   Bebidas
## 3378     2253          Abarrotes            Pan y Tortilla
## 3379     2253          Abarrotes    Lacteos y Refrigerados
## 3380     2253          Abarrotes   Alimentos para Mascotas
## 3381     2253          Abarrotes            Pan y Tortilla
## 3382     2253          Abarrotes                   Bebidas
## 3383     2253          Abarrotes    Lacteos y Refrigerados
## 3384     2254          Abarrotes                  Dulcería
## 3385     2256          Abarrotes                   Bebidas
## 3386     2256          Abarrotes        Limpieza del Hogar
## 3387     2258          Abarrotes                   Botanas
## 3388     2259          Abarrotes                   Bebidas
## 3389     2259          Abarrotes                   Bebidas
## 3390     2259          Abarrotes          Cuidado Personal
## 3391     2259          Abarrotes                   Bebidas
## 3392     2260          Abarrotes                   Botanas
## 3393     2260          Abarrotes                   Bebidas
## 3394     2261          Abarrotes                   Botanas
## 3395     2261          Abarrotes                   Bebidas
## 3396     2261          Abarrotes                   Bebidas
## 3397     2263          Abarrotes                   Bebidas
## 3398     2264          Abarrotes                   Botanas
## 3399     2264          Abarrotes                  Cereales
## 3400     2265          Abarrotes                   Bebidas
## 3401     2266          Abarrotes                  Cereales
## 3402     2266          Abarrotes    Lacteos y Refrigerados
## 3403     2266          Abarrotes                   Bebidas
## 3404     2266          Abarrotes C. Frías y Salchichonería
## 3405     2270          Abarrotes                   Bebidas
## 3406     2271          Abarrotes                   Bebidas
## 3407     2273          Abarrotes                   Bebidas
## 3408     2274          Abarrotes    Lacteos y Refrigerados
## 3409     2274          Abarrotes                   Bebidas
## 3410     2274          Abarrotes                   Bebidas
## 3411     2277          Abarrotes                   Bebidas
## 3412     2280          Abarrotes                   Botanas
## 3413     2280          Abarrotes                   Bebidas
## 3414     2281          Abarrotes                   Bebidas
## 3415     2282          Abarrotes                   Bebidas
## 3416     2282          Abarrotes                  Dulcería
## 3417     2283          Abarrotes                   Bebidas
## 3418     2283          Abarrotes                   Bebidas
## 3419     2284          Abarrotes                  Cereales
## 3420     2286          Abarrotes    Lacteos y Refrigerados
## 3421     2289          Abarrotes                   Bebidas
## 3422     2289          Abarrotes                   Bebidas
## 3423     2290          Abarrotes                   Bebidas
## 3424     2290          Abarrotes        Limpieza del Hogar
## 3425     2291          Abarrotes                   Bebidas
## 3426     2293          Abarrotes                   Bebidas
## 3427     2294          Abarrotes                   Bebidas
## 3428     2294          Abarrotes                  Aderezos
## 3429     2295          Abarrotes                   Botanas
## 3430     2295          Abarrotes    Lacteos y Refrigerados
## 3431     2296          Abarrotes                   Bebidas
## 3432     2296          Abarrotes        Limpieza del Hogar
## 3433     2297          Abarrotes                  Galletas
## 3434     2297          Abarrotes    Lacteos y Refrigerados
## 3435     2297          Abarrotes            Pan y Tortilla
## 3436     2300          Abarrotes                   Bebidas
## 3437     2302          Abarrotes                   Bebidas
## 3438     2302          Abarrotes                   Bebidas
## 3439     2302          Abarrotes                   Bebidas
## 3440     2303          Abarrotes            Pan y Tortilla
## 3441     2303          Abarrotes                   Bebidas
## 3442     2304          Abarrotes            Sopas y Pastas
## 3443     2304          Abarrotes        Limpieza del Hogar
## 3444     2304          Abarrotes    Lacteos y Refrigerados
## 3445     2305          Abarrotes                   Bebidas
## 3446     2305          Abarrotes             Azúcar y Miel
## 3447     2309          Abarrotes                   Bebidas
## 3448     2310          Abarrotes                   Bebidas
## 3449     2311          Abarrotes      Salsas y Sazonadores
## 3450     2312          Abarrotes      Salsas y Sazonadores
## 3451     2312          Abarrotes                   Bebidas
## 3452     2313          Abarrotes                   Bebidas
## 3453     2313          Abarrotes                   Latería
## 3454     2313          Abarrotes    Lacteos y Refrigerados
## 3455     2314          Abarrotes                   Bebidas
## 3456     2315          Abarrotes                   Bebidas
## 3457     2315          Abarrotes            Pan y Tortilla
## 3458     2315          Abarrotes                   Botanas
## 3459     2315          Abarrotes               Desechables
## 3460     2316          Abarrotes                   Botanas
## 3461     2316          Abarrotes                   Botanas
## 3462     2316          Abarrotes                   Bebidas
## 3463     2317          Abarrotes                  Mantecas
## 3464     2318          Abarrotes                   Bebidas
## 3465     2321          Abarrotes                   Bebidas
## 3466     2321          Abarrotes                   Bebidas
## 3467     2322          Abarrotes        Limpieza del Hogar
## 3468     2322          Abarrotes                   Bebidas
## 3469     2323          Abarrotes                  Galletas
## 3470     2323          Abarrotes        Limpieza del Hogar
## 3471     2323          Abarrotes                   Bebidas
## 3472     2324          Abarrotes                   Bebidas
## 3473     2325          Abarrotes            Pan y Tortilla
## 3474     2325          Abarrotes                   Botanas
## 3475     2327          Abarrotes                   Bebidas
## 3476     2329          Abarrotes                   Botanas
## 3477     2329          Abarrotes                    Aceite
## 3478     2329          Abarrotes                  Dulcería
## 3479     2330          Abarrotes                   Bebidas
## 3480     2330          Abarrotes                   Cerveza
## 3481     2331          Abarrotes            Pan y Tortilla
## 3482     2332          Abarrotes                   Botanas
## 3483     2337          Abarrotes                   Bebidas
## 3484     2337          Abarrotes                   Bebidas
## 3485     2338          Abarrotes                   Bebidas
## 3486     2339 Bebes e Infantiles                Accesorios
## 3487     2340          Abarrotes        Limpieza del Hogar
## 3488     2340          Abarrotes        Limpieza del Hogar
## 3489     2341          Abarrotes    Harinas y Complementos
## 3490     2342          Abarrotes            Pan y Tortilla
## 3491     2342          Abarrotes                   Bebidas
## 3492     2342          Abarrotes                  Especias
## 3493     2343          Abarrotes                   Bebidas
## 3494     2344          Abarrotes                   Bebidas
## 3495     2344          Abarrotes                  Galletas
## 3496     2344          Abarrotes    Lacteos y Refrigerados
## 3497     2345          Abarrotes                   Bebidas
## 3498     2346          Abarrotes                   Bebidas
## 3499     2347          Abarrotes                   Bebidas
## 3500     2348          Abarrotes                   Bebidas
## 3501     2349          Abarrotes                   Bebidas
## 3502     2350          Abarrotes                  Aderezos
## 3503     2351          Abarrotes    Lacteos y Refrigerados
## 3504     2352          Abarrotes                   Bebidas
## 3505     2353          Abarrotes                   Latería
## 3506     2354          Abarrotes                   Bebidas
## 3507     2355          Abarrotes    Lacteos y Refrigerados
## 3508     2355          Abarrotes                   Botanas
## 3509     2357          Abarrotes                   Botanas
## 3510     2357          Abarrotes                  Galletas
## 3511     2357          Abarrotes        Limpieza del Hogar
## 3512     2357          Abarrotes                   Bebidas
## 3513     2358          Abarrotes                   Botanas
## 3514     2358          Abarrotes                   Botanas
## 3515     2358          Abarrotes                   Botanas
## 3516     2361          Abarrotes                   Botanas
## 3517     2361          Abarrotes                   Botanas
## 3518     2362          Abarrotes        Limpieza del Hogar
## 3519     2364          Abarrotes    Lacteos y Refrigerados
## 3520     2364          Abarrotes                   Botanas
## 3521     2364          Abarrotes                   Bebidas
## 3522     2365          Abarrotes                  Cigarros
## 3523     2365          Abarrotes                   Bebidas
## 3524     2366          Abarrotes                   Bebidas
## 3525     2366          Abarrotes                   Botanas
## 3526     2367          Abarrotes                   Bebidas
## 3527     2368          Abarrotes                   Bebidas
## 3528     2369          Abarrotes        Limpieza del Hogar
## 3529     2369          Abarrotes                   Bebidas
## 3530     2370          Abarrotes                   Bebidas
## 3531     2371          Abarrotes                  Galletas
## 3532     2372          Abarrotes    Lacteos y Refrigerados
## 3533     2374          Abarrotes                   Bebidas
## 3534     2375          Abarrotes                   Botanas
## 3535     2375          Abarrotes                   Botanas
## 3536     2376          Abarrotes         Velas y Veladoras
## 3537     2377          Abarrotes                  Especias
## 3538     2377          Abarrotes        Limpieza del Hogar
## 3539     2377          Abarrotes                  Galletas
## 3540     2377          Abarrotes            Pan y Tortilla
## 3541     2377          Abarrotes                  Galletas
## 3542     2377          Abarrotes                  Cereales
## 3543     2377          Abarrotes      Salsas y Sazonadores
## 3544     2377          Abarrotes        Limpieza del Hogar
## 3545     2377          Abarrotes            Pan y Tortilla
## 3546     2377          Abarrotes                  Aderezos
## 3547     2377          Abarrotes         Granos y Semillas
## 3548     2378          Abarrotes                   Bebidas
## 3549     2379          Abarrotes                   Botanas
## 3550     2379          Abarrotes                   Botanas
## 3551     2379          Abarrotes                  Especias
## 3552     2380          Abarrotes                   Bebidas
## 3553     2381          Abarrotes                   Bebidas
## 3554     2382          Abarrotes                   Bebidas
## 3555     2383 Bebes e Infantiles                Alimentos 
## 3556     2384          Abarrotes                   Bebidas
## 3557     2385          Abarrotes                  Galletas
## 3558     2386          Abarrotes                   Bebidas
## 3559     2388          Abarrotes            Pan y Tortilla
## 3560     2388          Abarrotes                  Aderezos
## 3561     2389          Abarrotes C. Frías y Salchichonería
## 3562     2389          Abarrotes            Pan y Tortilla
## 3563     2391          Abarrotes                   Bebidas
## 3564     2391          Abarrotes          Cuidado Personal
## 3565     2392          Abarrotes                   Bebidas
## 3566     2393          Abarrotes          Cuidado Personal
## 3567     2394          Abarrotes                   Bebidas
## 3568     2395          Abarrotes            Pan y Tortilla
## 3569     2395          Abarrotes    Lacteos y Refrigerados
## 3570     2396          Abarrotes                   Bebidas
## 3571     2396          Abarrotes    Lacteos y Refrigerados
## 3572     2401          Abarrotes                   Bebidas
## 3573     2401          Abarrotes    Lacteos y Refrigerados
## 3574     2401          Abarrotes                   Bebidas
## 3575     2403          Abarrotes                  Cigarros
## 3576     2403          Abarrotes                  Galletas
## 3577     2403          Abarrotes                   Bebidas
## 3578     2404          Abarrotes                   Bebidas
## 3579     2404          Abarrotes                  Galletas
## 3580     2405          Abarrotes        Limpieza del Hogar
## 3581     2405          Abarrotes        Limpieza del Hogar
## 3582     2405          Abarrotes            Pan y Tortilla
## 3583     2405          Abarrotes                   Bebidas
## 3584     2406          Abarrotes                  Galletas
## 3585     2406          Abarrotes                   Bebidas
## 3586     2407          Abarrotes                   Bebidas
## 3587     2408          Abarrotes                   Botanas
## 3588     2408          Abarrotes                   Bebidas
## 3589     2408          Abarrotes    Lacteos y Refrigerados
## 3590     2408          Abarrotes                   Bebidas
## 3591     2409          Abarrotes                  Galletas
## 3592     2409          Abarrotes                   Botanas
## 3593     2411          Abarrotes                   Bebidas
## 3594     2411          Abarrotes                  Cigarros
## 3595     2412          Abarrotes                  Galletas
## 3596     2412          Abarrotes                   Bebidas
## 3597     2414          Abarrotes            Sopas y Pastas
## 3598     2414          Abarrotes                   Bebidas
## 3599     2416          Abarrotes                   Botanas
## 3600     2416          Abarrotes            Pan y Tortilla
## 3601     2416          Abarrotes                   Bebidas
## 3602     2416          Abarrotes                   Bebidas
## 3603     2417          Abarrotes                  Cigarros
## 3604     2418          Abarrotes                   Bebidas
## 3605     2419          Abarrotes                   Bebidas
## 3606     2419          Abarrotes            Pan y Tortilla
## 3607     2420          Abarrotes                   Botanas
## 3608     2420          Abarrotes                  Cigarros
## 3609     2422          Abarrotes                   Botanas
## 3610     2422          Abarrotes    Lacteos y Refrigerados
## 3611     2422          Abarrotes               Desechables
## 3612     2423          Abarrotes                   Bebidas
## 3613     2424          Abarrotes                   Bebidas
## 3614     2424          Abarrotes                   Bebidas
## 3615     2424          Abarrotes            Pan y Tortilla
## 3616     2425          Abarrotes                   Botanas
## 3617     2425          Abarrotes        Limpieza del Hogar
## 3618     2425          Abarrotes        Limpieza del Hogar
## 3619     2425          Abarrotes                   Botanas
## 3620     2426          Abarrotes            Pan y Tortilla
## 3621     2427          Abarrotes            Pan y Tortilla
## 3622     2427          Abarrotes         Granos y Semillas
## 3623     2427          Abarrotes                   Bebidas
## 3624     2429          Abarrotes                  Aderezos
## 3625     2430          Abarrotes                   Latería
## 3626     2430          Abarrotes                   Bebidas
## 3627     2430          Abarrotes                   Bebidas
## 3628     2431          Abarrotes                   Botanas
## 3629     2431          Abarrotes                   Botanas
## 3630     2431          Abarrotes                   Botanas
## 3631     2431          Abarrotes                   Bebidas
## 3632     2432          Abarrotes    Lacteos y Refrigerados
## 3633     2433          Abarrotes    Lacteos y Refrigerados
## 3634     2433          Abarrotes                   Bebidas
## 3635     2433          Abarrotes               Desechables
## 3636     2435          Abarrotes    Lacteos y Refrigerados
## 3637     2436          Abarrotes                  Dulcería
## 3638     2437          Abarrotes                   Botanas
## 3639     2437          Abarrotes            Sopas y Pastas
## 3640     2437          Abarrotes                  Galletas
## 3641     2437          Abarrotes            Pan y Tortilla
## 3642     2437          Abarrotes                   Botanas
## 3643     2437          Abarrotes                   Bebidas
## 3644     2437          Abarrotes                   Bebidas
## 3645     2437          Abarrotes                   Botanas
## 3646     2437          Abarrotes            Sopas y Pastas
## 3647     2438          Abarrotes                   Bebidas
## 3648     2438          Abarrotes                   Bebidas
## 3649     2439          Abarrotes                  Dulcería
## 3650     2440          Abarrotes                   Bebidas
## 3651     2440          Abarrotes                   Bebidas
## 3652     2441          Abarrotes                   Bebidas
## 3653     2443          Abarrotes                   Bebidas
## 3654     2443          Abarrotes      Te, Chocolate y Café
## 3655     2444          Abarrotes                   Bebidas
## 3656     2444          Abarrotes                   Bebidas
## 3657     2444          Abarrotes                  Especias
## 3658     2444          Abarrotes         Granos y Semillas
## 3659     2445          Abarrotes         Velas y Veladoras
## 3660     2447          Abarrotes                   Bebidas
## 3661     2447          Abarrotes                   Bebidas
## 3662     2448          Abarrotes        Limpieza del Hogar
## 3663     2449          Abarrotes                   Bebidas
## 3664     2450          Abarrotes                   Bebidas
## 3665     2452          Abarrotes    Lacteos y Refrigerados
## 3666     2452          Abarrotes        Limpieza del Hogar
## 3667     2452          Abarrotes                   Botanas
## 3668     2452          Abarrotes            Sopas y Pastas
## 3669     2453          Abarrotes                   Bebidas
## 3670     2454          Abarrotes                   Botanas
## 3671     2455          Abarrotes                   Bebidas
## 3672     2455          Abarrotes                   Bebidas
## 3673     2456          Abarrotes                   Bebidas
## 3674     2456          Abarrotes                   Bebidas
## 3675     2457          Abarrotes             Azúcar y Miel
## 3676     2458          Abarrotes        Limpieza del Hogar
## 3677     2458          Abarrotes                   Bebidas
## 3678     2458          Abarrotes                   Bebidas
## 3679     2458          Abarrotes         Granos y Semillas
## 3680     2458          Abarrotes                  Mantecas
## 3681     2458          Abarrotes                   Bebidas
## 3682     2458          Abarrotes                  Especias
## 3683     2460          Abarrotes                  Aderezos
## 3684     2460          Abarrotes        Limpieza del Hogar
## 3685     2460          Abarrotes    Lacteos y Refrigerados
## 3686     2461          Abarrotes    Lacteos y Refrigerados
## 3687     2463          Abarrotes      Salsas y Sazonadores
## 3688     2463          Abarrotes        Limpieza del Hogar
## 3689     2463          Abarrotes        Limpieza del Hogar
## 3690     2467          Abarrotes                   Bebidas
## 3691     2467          Abarrotes                   Bebidas
## 3692     2467          Abarrotes                   Bebidas
## 3693     2468          Abarrotes    Lacteos y Refrigerados
## 3694     2469          Abarrotes                   Bebidas
## 3695     2470          Abarrotes                  Dulcería
## 3696     2472          Abarrotes                   Bebidas
## 3697     2474          Abarrotes                   Bebidas
## 3698     2474          Abarrotes                   Bebidas
## 3699     2475          Abarrotes                   Bebidas
## 3700     2475          Abarrotes                   Bebidas
## 3701     2476          Abarrotes                   Bebidas
## 3702     2476          Abarrotes                   Bebidas
## 3703     2476          Abarrotes                   Bebidas
## 3704     2477          Abarrotes         Granos y Semillas
## 3705     2479          Abarrotes                   Bebidas
## 3706     2480          Abarrotes                  Dulcería
## 3707     2481          Abarrotes                   Botanas
## 3708     2482          Abarrotes                   Bebidas
## 3709     2482          Abarrotes                   Bebidas
## 3710     2482          Abarrotes                   Bebidas
## 3711     2482          Abarrotes        Limpieza del Hogar
## 3712     2484          Abarrotes                   Bebidas
## 3713     2484          Abarrotes                   Bebidas
## 3714     2485          Abarrotes      Salsas y Sazonadores
## 3715     2486          Abarrotes                   Bebidas
## 3716     2486          Abarrotes            Pan y Tortilla
## 3717     2487          Abarrotes                   Botanas
## 3718     2487          Abarrotes                  Dulcería
## 3719     2488          Abarrotes                   Bebidas
## 3720     2489          Abarrotes                   Bebidas
## 3721     2490          Abarrotes                  Cigarros
## 3722     2490          Abarrotes            Pan y Tortilla
## 3723     2490          Abarrotes                   Botanas
## 3724     2492          Abarrotes                   Bebidas
## 3725     2492          Abarrotes                   Botanas
## 3726     2492          Abarrotes            Pan y Tortilla
## 3727     2494          Abarrotes                   Bebidas
## 3728     2495          Abarrotes            Pan y Tortilla
## 3729     2495          Abarrotes                   Bebidas
## 3730     2495          Abarrotes    Lacteos y Refrigerados
## 3731     2495          Abarrotes                    Aceite
## 3732     2497          Abarrotes                   Botanas
## 3733     2497          Abarrotes                   Botanas
## 3734     2497          Abarrotes                   Bebidas
## 3735     2497          Abarrotes                   Bebidas
## 3736     2497          Abarrotes                   Bebidas
## 3737     2497          Abarrotes                  Galletas
## 3738     2498          Abarrotes                  Cigarros
## 3739     2498          Abarrotes                   Bebidas
## 3740     2498          Abarrotes                   Bebidas
## 3741     2499          Abarrotes                   Bebidas
## 3742     2499          Abarrotes                   Bebidas
## 3743     2500          Abarrotes                  Cigarros
## 3744     2502          Abarrotes                   Bebidas
## 3745     2502          Abarrotes            Sopas y Pastas
## 3746     2502          Abarrotes                   Bebidas
## 3747     2503          Abarrotes            Pan y Tortilla
## 3748     2503          Abarrotes                   Bebidas
## 3749     2503          Abarrotes                   Bebidas
## 3750     2504          Abarrotes                   Bebidas
## 3751     2505          Abarrotes          Cuidado Personal
## 3752     2506          Abarrotes                   Botanas
## 3753     2507          Abarrotes                   Bebidas
## 3754     2508          Abarrotes                   Bebidas
## 3755     2509          Abarrotes                   Botanas
## 3756     2509          Abarrotes                  Aderezos
## 3757     2510          Abarrotes                   Botanas
## 3758     2510          Abarrotes                   Bebidas
## 3759     2511          Abarrotes                   Bebidas
## 3760     2512          Abarrotes                   Bebidas
## 3761     2513          Abarrotes                   Botanas
## 3762     2513          Abarrotes                   Botanas
## 3763     2513          Abarrotes                   Latería
## 3764     2513          Abarrotes                   Bebidas
## 3765     2513          Abarrotes               Desechables
## 3766     2514          Abarrotes                  Dulcería
## 3767     2515          Abarrotes                   Bebidas
## 3768     2516          Abarrotes                   Bebidas
## 3769     2516          Abarrotes                   Bebidas
## 3770     2517          Abarrotes                   Bebidas
## 3771     2518          Abarrotes                  Dulcería
## 3772     2518          Abarrotes                   Botanas
## 3773     2519          Abarrotes    Lacteos y Refrigerados
## 3774     2520         Ferretería  Pilas para uso Doméstico
## 3775     2520          Abarrotes                   Bebidas
## 3776     2520          Abarrotes                  Galletas
## 3777     2521          Abarrotes                   Bebidas
## 3778     2521          Abarrotes                  Cigarros
## 3779     2522          Abarrotes                   Bebidas
## 3780     2522          Abarrotes                   Bebidas
## 3781     2523          Abarrotes                   Botanas
## 3782     2523          Abarrotes                   Bebidas
## 3783     2524          Abarrotes                   Botanas
## 3784     2524          Abarrotes    Lacteos y Refrigerados
## 3785     2526          Abarrotes                   Bebidas
## 3786     2526          Abarrotes                  Galletas
## 3787     2526          Abarrotes                  Dulcería
## 3788     2527          Abarrotes    Lacteos y Refrigerados
## 3789     2527          Abarrotes                   Botanas
## 3790     2527          Abarrotes                  Cigarros
## 3791     2527          Abarrotes    Lacteos y Refrigerados
## 3792     2528          Abarrotes                  Dulcería
## 3793     2528          Abarrotes                   Botanas
## 3794     2528          Abarrotes                   Botanas
## 3795     2529          Abarrotes                   Bebidas
## 3796     2529          Abarrotes C. Frías y Salchichonería
## 3797     2529          Abarrotes C. Frías y Salchichonería
## 3798     2529          Abarrotes    Lacteos y Refrigerados
## 3799     2529          Abarrotes                   Bebidas
## 3800     2530          Abarrotes                   Bebidas
## 3801     2531          Abarrotes                   Bebidas
## 3802     2532          Abarrotes                   Botanas
## 3803     2532          Abarrotes                   Botanas
## 3804     2532          Abarrotes             Azúcar y Miel
## 3805     2532          Abarrotes                   Bebidas
## 3806     2533          Abarrotes            Pan y Tortilla
## 3807     2534          Abarrotes                   Bebidas
## 3808     2534          Abarrotes                   Bebidas
## 3809     2534          Abarrotes                   Bebidas
## 3810     2535          Abarrotes                  Dulcería
## 3811     2536          Abarrotes                   Botanas
## 3812     2536          Abarrotes    Lacteos y Refrigerados
## 3813     2539          Abarrotes                   Bebidas
## 3814     2539          Abarrotes                  Cigarros
## 3815     2542          Abarrotes            Pan y Tortilla
## 3816     2543          Abarrotes                  Cereales
## 3817     2546          Abarrotes                  Galletas
## 3818     2546          Abarrotes                   Bebidas
## 3819     2546          Abarrotes                   Bebidas
## 3820     2549          Abarrotes                   Botanas
## 3821     2549          Abarrotes                   Botanas
## 3822     2549          Abarrotes      Salsas y Sazonadores
## 3823     2549          Abarrotes                   Bebidas
## 3824     2549          Abarrotes                   Bebidas
## 3825     2550          Abarrotes                   Bebidas
## 3826     2550          Abarrotes                   Bebidas
## 3827     2551          Abarrotes                   Bebidas
## 3828     2552          Abarrotes                   Botanas
## 3829     2553          Abarrotes                  Dulcería
## 3830     2554         Ferretería  Pilas para uso Doméstico
## 3831     2554          Abarrotes                   Bebidas
## 3832     2555          Abarrotes                   Bebidas
## 3833     2555          Abarrotes                  Dulcería
## 3834     2556          Abarrotes                   Bebidas
## 3835     2558          Abarrotes                   Bebidas
## 3836     2559          Abarrotes                  Galletas
## 3837     2559          Abarrotes                  Galletas
## 3838     2561          Abarrotes                   Bebidas
## 3839     2561          Abarrotes                   Bebidas
## 3840     2563          Abarrotes                   Botanas
## 3841     2564          Abarrotes            Pan y Tortilla
## 3842     2564          Abarrotes                   Botanas
## 3843     2564          Abarrotes                   Bebidas
## 3844     2565          Abarrotes                   Bebidas
## 3845     2565          Abarrotes                   Botanas
## 3846     2565          Abarrotes                   Bebidas
## 3847     2566          Abarrotes                  Galletas
## 3848     2566          Abarrotes                  Galletas
## 3849     2566          Abarrotes            Pan y Tortilla
## 3850     2566          Abarrotes                   Bebidas
## 3851     2566          Abarrotes    Lacteos y Refrigerados
## 3852     2567          Abarrotes                   Bebidas
## 3853     2568          Abarrotes            Pan y Tortilla
## 3854     2568          Abarrotes        Limpieza del Hogar
## 3855     2568          Abarrotes                   Bebidas
## 3856     2568          Abarrotes      Salsas y Sazonadores
## 3857     2569          Abarrotes                   Botanas
## 3858     2570          Abarrotes                   Bebidas
## 3859     2570          Abarrotes                   Bebidas
## 3860     2571          Abarrotes                   Botanas
## 3861     2573          Abarrotes          Cuidado Personal
## 3862     2573          Abarrotes                  Dulcería
## 3863     2574          Abarrotes            Pan y Tortilla
## 3864     2576          Abarrotes C. Frías y Salchichonería
## 3865     2576          Abarrotes                   Bebidas
## 3866     2577          Abarrotes    Lacteos y Refrigerados
## 3867     2577          Abarrotes      Te, Chocolate y Café
## 3868     2577          Abarrotes                  Cigarros
## 3869     2578          Abarrotes      Salsas y Sazonadores
## 3870     2578          Abarrotes                   Bebidas
## 3871     2579          Abarrotes               Desechables
## 3872     2579          Abarrotes               Desechables
## 3873     2580          Abarrotes                   Bebidas
## 3874     2581          Abarrotes        Limpieza del Hogar
## 3875     2583          Abarrotes                   Bebidas
## 3876     2584 Bebes e Infantiles                Alimentos 
## 3877     2585          Abarrotes                  Cigarros
## 3878     2585          Abarrotes                  Galletas
## 3879     2585          Abarrotes            Pan y Tortilla
## 3880     2585          Abarrotes    Lacteos y Refrigerados
## 3881     2585          Abarrotes                    Aceite
## 3882     2585          Abarrotes                   Bebidas
## 3883     2586         Ferretería  Pilas para uso Doméstico
## 3884     2586          Abarrotes                   Botanas
## 3885     2586          Abarrotes                   Botanas
## 3886     2586          Abarrotes                   Botanas
## 3887     2587          Abarrotes                   Botanas
## 3888     2587          Abarrotes                   Bebidas
## 3889     2587          Abarrotes                  Cigarros
## 3890     2589          Abarrotes    Lacteos y Refrigerados
## 3891     2589          Abarrotes    Lacteos y Refrigerados
## 3892     2589          Abarrotes                   Bebidas
## 3893     2589          Abarrotes                   Bebidas
## 3894     2591          Abarrotes                   Bebidas
## 3895     2592          Abarrotes    Lacteos y Refrigerados
## 3896     2593          Abarrotes                   Bebidas
## 3897     2594          Abarrotes        Limpieza del Hogar
## 3898     2594          Abarrotes                   Bebidas
## 3899     2594          Abarrotes                   Bebidas
## 3900     2596          Abarrotes            Pan y Tortilla
## 3901     2599          Abarrotes                   Bebidas
## 3902     2600          Abarrotes                   Botanas
## 3903     2600          Abarrotes                   Bebidas
## 3904     2601          Abarrotes                   Bebidas
## 3905     2603          Abarrotes    Lacteos y Refrigerados
## 3906     2603          Abarrotes                  Dulcería
## 3907     2603          Abarrotes                   Bebidas
## 3908     2604          Abarrotes                   Botanas
## 3909     2604          Abarrotes                  Galletas
## 3910     2604          Abarrotes                   Bebidas
## 3911     2604          Abarrotes                   Bebidas
## 3912     2605          Abarrotes                   Bebidas
## 3913     2606          Abarrotes            Pan y Tortilla
## 3914     2606          Abarrotes    Lacteos y Refrigerados
## 3915     2606          Abarrotes                   Bebidas
## 3916     2607          Abarrotes    Harinas y Complementos
## 3917     2608          Abarrotes                  Cigarros
## 3918     2609          Abarrotes        Limpieza del Hogar
## 3919     2609          Abarrotes                   Botanas
## 3920     2610          Abarrotes    Lacteos y Refrigerados
## 3921     2610          Abarrotes                   Bebidas
## 3922     2613          Abarrotes                   Latería
## 3923     2613          Abarrotes                   Bebidas
## 3924     2613          Abarrotes                   Bebidas
## 3925     2614          Abarrotes                   Bebidas
## 3926     2616          Abarrotes                   Botanas
## 3927     2617          Abarrotes                   Botanas
## 3928     2618          Abarrotes                   Botanas
## 3929     2620          Abarrotes            Pan y Tortilla
## 3930     2620          Abarrotes                   Bebidas
## 3931     2621          Abarrotes                   Bebidas
## 3932     2621          Abarrotes                  Cigarros
## 3933     2623          Abarrotes    Lacteos y Refrigerados
## 3934     2623          Abarrotes                   Bebidas
## 3935     2625          Abarrotes C. Frías y Salchichonería
## 3936     2625          Abarrotes            Pan y Tortilla
## 3937     2625          Abarrotes            Pan y Tortilla
## 3938     2625          Abarrotes    Lacteos y Refrigerados
## 3939     2625          Abarrotes                   Bebidas
## 3940     2626          Abarrotes            Pan y Tortilla
## 3941     2627          Abarrotes      Salsas y Sazonadores
## 3942     2627          Abarrotes                  Dulcería
## 3943     2628          Abarrotes                  Cigarros
## 3944     2629          Abarrotes                   Botanas
## 3945     2629          Abarrotes                   Botanas
## 3946     2629          Abarrotes                   Botanas
## 3947     2630          Abarrotes                   Botanas
## 3948     2631          Abarrotes                   Bebidas
## 3949     2633          Abarrotes      Te, Chocolate y Café
## 3950     2634          Abarrotes                   Botanas
## 3951     2634          Abarrotes                  Cigarros
## 3952     2635          Abarrotes                   Botanas
## 3953     2635          Abarrotes                   Bebidas
## 3954     2635          Abarrotes                   Bebidas
## 3955     2639          Abarrotes                  Cigarros
## 3956     2639          Abarrotes                   Botanas
## 3957     2639          Abarrotes                   Bebidas
## 3958     2640          Abarrotes                   Botanas
## 3959     2640          Abarrotes            Pan y Tortilla
## 3960     2640          Abarrotes                   Bebidas
## 3961     2641          Abarrotes            Pan y Tortilla
## 3962     2642          Abarrotes                   Bebidas
## 3963     2642          Abarrotes                   Bebidas
## 3964     2642          Abarrotes                   Botanas
## 3965     2643          Abarrotes                   Bebidas
## 3966     2643          Abarrotes                  Cigarros
## 3967     2645          Abarrotes                   Bebidas
## 3968     2645          Abarrotes                  Cigarros
## 3969     2646          Abarrotes                   Botanas
## 3970     2646          Abarrotes                   Bebidas
## 3971     2646          Abarrotes                   Bebidas
## 3972     2647          Abarrotes                   Bebidas
## 3973     2647          Abarrotes                   Bebidas
## 3974     2647          Abarrotes                   Bebidas
## 3975     2651          Abarrotes                  Especias
## 3976     2651          Abarrotes                   Bebidas
## 3977     2652          Abarrotes                   Bebidas
## 3978     2652         Ferretería                Pegamentos
## 3979     2654          Abarrotes          Cuidado Personal
## 3980     2655          Abarrotes            Pan y Tortilla
## 3981     2655          Abarrotes                   Bebidas
## 3982     2655          Abarrotes                   Bebidas
## 3983     2656          Abarrotes            Pan y Tortilla
## 3984     2656          Abarrotes             Azúcar y Miel
## 3985     2657          Abarrotes    Lacteos y Refrigerados
## 3986     2658          Abarrotes                   Bebidas
## 3987     2660          Abarrotes                   Cerveza
## 3988     2660          Abarrotes                   Bebidas
## 3989     2660          Abarrotes                  Cigarros
## 3990     2660          Abarrotes                   Bebidas
## 3991     2661          Abarrotes            Pan y Tortilla
## 3992     2661          Abarrotes    Lacteos y Refrigerados
## 3993     2661          Abarrotes                   Bebidas
## 3994     2662          Abarrotes                  Galletas
## 3995     2662          Abarrotes                   Bebidas
## 3996     2664          Abarrotes                   Cerveza
## 3997     2665          Abarrotes                   Bebidas
## 3998     2665          Abarrotes            Pan y Tortilla
## 3999     2665          Abarrotes                   Bebidas
## 4000     2666          Abarrotes        Limpieza del Hogar
## 4001     2666          Abarrotes          Cuidado Personal
## 4002     2667          Abarrotes                   Bebidas
## 4003     2668          Abarrotes    Lacteos y Refrigerados
## 4004     2668          Abarrotes                   Botanas
## 4005     2668          Abarrotes        Limpieza del Hogar
## 4006     2669          Abarrotes                   Bebidas
## 4007     2669          Abarrotes                   Bebidas
## 4008     2671          Abarrotes                   Bebidas
## 4009     2671          Abarrotes                  Dulcería
## 4010     2672          Abarrotes                   Bebidas
## 4011     2672          Abarrotes    Lacteos y Refrigerados
## 4012     2673          Abarrotes                   Bebidas
## 4013     2673          Abarrotes                  Dulcería
## 4014     2675          Abarrotes                  Galletas
## 4015     2675          Abarrotes                   Bebidas
## 4016     2675          Abarrotes            Pan y Tortilla
## 4017     2675          Abarrotes                   Bebidas
## 4018     2675          Abarrotes                   Bebidas
## 4019     2675          Abarrotes                  Dulcería
## 4020     2676          Abarrotes                   Botanas
## 4021     2676          Abarrotes                    Aceite
## 4022     2677          Abarrotes                   Botanas
## 4023     2678          Abarrotes                  Galletas
## 4024     2678          Abarrotes    Lacteos y Refrigerados
## 4025     2679          Abarrotes            Pan y Tortilla
## 4026     2679          Abarrotes                   Bebidas
## 4027     2680          Abarrotes          Cuidado Personal
## 4028     2680          Abarrotes                   Botanas
## 4029     2680          Abarrotes            Pan y Tortilla
## 4030     2681          Abarrotes                   Bebidas
## 4031     2681          Abarrotes         Granos y Semillas
## 4032     2682          Abarrotes                   Botanas
## 4033     2683          Abarrotes                  Galletas
## 4034     2684          Abarrotes    Lacteos y Refrigerados
## 4035     2684          Abarrotes                   Bebidas
## 4036     2684          Abarrotes                   Bebidas
## 4037     2686          Abarrotes                   Botanas
## 4038     2686          Abarrotes                   Botanas
## 4039     2686          Abarrotes            Pan y Tortilla
## 4040     2686          Abarrotes            Pan y Tortilla
## 4041     2686          Abarrotes                   Botanas
## 4042     2687          Abarrotes                   Bebidas
## 4043     2687          Abarrotes                   Bebidas
## 4044     2687          Abarrotes                   Bebidas
## 4045     2688          Abarrotes                   Bebidas
## 4046     2688          Abarrotes                   Bebidas
## 4047     2690          Abarrotes                  Cigarros
## 4048     2692          Abarrotes                   Bebidas
## 4049     2693          Abarrotes                  Galletas
## 4050     2693          Abarrotes    Lacteos y Refrigerados
## 4051     2694          Abarrotes                   Bebidas
## 4052     2694          Abarrotes                   Bebidas
## 4053     2694          Abarrotes                   Bebidas
## 4054     2695          Abarrotes                   Bebidas
## 4055     2696          Abarrotes                   Bebidas
## 4056     2697          Abarrotes            Pan y Tortilla
## 4057     2697          Abarrotes                   Bebidas
## 4058     2697          Abarrotes                   Bebidas
## 4059     2698          Abarrotes                   Latería
## 4060     2699          Abarrotes            Pan y Tortilla
## 4061     2699          Abarrotes                   Bebidas
## 4062     2700          Abarrotes         Velas y Veladoras
## 4063     2700          Abarrotes        Limpieza del Hogar
## 4064     2700          Abarrotes                   Bebidas
## 4065     2701          Abarrotes                  Galletas
## 4066     2702          Abarrotes                   Bebidas
## 4067     2703          Abarrotes    Lacteos y Refrigerados
## 4068     2703          Abarrotes                   Bebidas
## 4069     2703          Abarrotes            Pan y Tortilla
## 4070     2703          Abarrotes            Pan y Tortilla
## 4071     2703          Abarrotes                   Botanas
## 4072     2704          Abarrotes                   Bebidas
## 4073     2705          Abarrotes                  Galletas
## 4074     2705          Abarrotes                   Botanas
## 4075     2705          Abarrotes                   Bebidas
## 4076     2706          Abarrotes            Sopas y Pastas
## 4077     2706          Abarrotes    Lacteos y Refrigerados
## 4078     2706          Abarrotes                   Bebidas
## 4079     2706          Abarrotes            Pan y Tortilla
## 4080     2706          Abarrotes                   Bebidas
## 4081     2706          Abarrotes                   Bebidas
## 4082     2707          Abarrotes            Sopas y Pastas
## 4083     2707          Abarrotes                   Bebidas
## 4084     2708          Abarrotes                   Botanas
## 4085     2709          Abarrotes                   Botanas
## 4086     2709          Abarrotes                   Botanas
## 4087     2709          Abarrotes                   Botanas
## 4088     2709          Abarrotes    Lacteos y Refrigerados
## 4089     2709          Abarrotes                   Bebidas
## 4090     2710          Abarrotes            Pan y Tortilla
## 4091     2710          Abarrotes            Pan y Tortilla
## 4092     2710          Abarrotes            Pan y Tortilla
## 4093     2710          Abarrotes                   Bebidas
## 4094     2712          Abarrotes                   Bebidas
## 4095     2712          Abarrotes                   Botanas
## 4096     2712          Abarrotes                   Bebidas
## 4097     2712          Abarrotes         Granos y Semillas
## 4098     2715          Abarrotes                   Botanas
## 4099     2715          Abarrotes                   Botanas
## 4100     2715          Abarrotes                   Botanas
## 4101     2715          Abarrotes    Lacteos y Refrigerados
## 4102     2715          Abarrotes                  Dulcería
## 4103     2716          Abarrotes                   Bebidas
## 4104     2717          Abarrotes                   Latería
## 4105     2717          Abarrotes                   Bebidas
## 4106     2717          Abarrotes                   Bebidas
## 4107     2718          Abarrotes                  Cigarros
## 4108     2718          Abarrotes                   Bebidas
## 4109     2719          Abarrotes    Lacteos y Refrigerados
## 4110     2719          Abarrotes        Limpieza del Hogar
## 4111     2720          Abarrotes                  Cigarros
## 4112     2720          Abarrotes                   Botanas
## 4113     2720          Abarrotes                   Botanas
## 4114     2720          Abarrotes            Pan y Tortilla
## 4115     2720          Abarrotes                   Bebidas
## 4116     2720          Abarrotes                   Bebidas
## 4117     2724          Abarrotes             Azúcar y Miel
## 4118     2724          Abarrotes                   Bebidas
## 4119     2725          Abarrotes            Sopas y Pastas
## 4120     2726          Abarrotes                   Bebidas
## 4121     2726          Abarrotes            Sopas y Pastas
## 4122     2727          Abarrotes                   Bebidas
## 4123     2727          Abarrotes                  Dulcería
## 4124     2727          Abarrotes                   Bebidas
## 4125     2727          Abarrotes                   Bebidas
## 4126     2728          Abarrotes                  Dulcería
## 4127     2728          Abarrotes                   Bebidas
## 4128     2729          Abarrotes                   Bebidas
## 4129     2732          Abarrotes                   Botanas
## 4130     2732          Abarrotes                   Bebidas
## 4131     2733          Abarrotes        Limpieza del Hogar
## 4132     2733          Abarrotes        Limpieza del Hogar
## 4133     2733          Abarrotes            Pan y Tortilla
## 4134     2733          Abarrotes    Lacteos y Refrigerados
## 4135     2733          Abarrotes                   Bebidas
## 4136     2734          Abarrotes                   Bebidas
## 4137     2735          Abarrotes                   Bebidas
## 4138     2735          Abarrotes                  Galletas
## 4139     2736          Abarrotes                  Cigarros
## 4140     2738          Abarrotes                  Cereales
## 4141     2738          Abarrotes                   Bebidas
## 4142     2738          Abarrotes                  Cigarros
## 4143     2739          Abarrotes                   Bebidas
## 4144     2741          Abarrotes        Limpieza del Hogar
## 4145     2742          Abarrotes                   Bebidas
## 4146     2743          Abarrotes                   Botanas
## 4147     2744          Abarrotes    Lacteos y Refrigerados
## 4148     2747          Abarrotes                   Bebidas
## 4149     2749          Abarrotes                   Bebidas
## 4150     2749          Abarrotes                   Botanas
## 4151     2751          Abarrotes                   Botanas
## 4152     2751          Abarrotes                   Bebidas
## 4153     2752          Abarrotes            Pan y Tortilla
## 4154     2753          Abarrotes                   Bebidas
## 4155     2754          Abarrotes        Limpieza del Hogar
## 4156     2754          Abarrotes        Limpieza del Hogar
## 4157     2754          Abarrotes                   Latería
## 4158     2754          Abarrotes    Lacteos y Refrigerados
## 4159     2754          Abarrotes    Lacteos y Refrigerados
## 4160     2754          Abarrotes        Limpieza del Hogar
## 4161     2754          Abarrotes        Limpieza del Hogar
## 4162     2754          Abarrotes        Limpieza del Hogar
## 4163     2754          Abarrotes        Limpieza del Hogar
## 4164     2754 Bebes e Infantiles      Productos Higiénicos
## 4165     2754          Abarrotes          Cuidado Personal
## 4166     2755          Abarrotes         Velas y Veladoras
## 4167     2756          Abarrotes            Pan y Tortilla
## 4168     2756          Abarrotes                   Bebidas
## 4169     2757          Abarrotes            Pan y Tortilla
## 4170     2757          Abarrotes    Lacteos y Refrigerados
## 4171     2757          Abarrotes                   Bebidas
## 4172     2757          Abarrotes                   Bebidas
## 4173     2759          Abarrotes                   Botanas
## 4174     2760          Abarrotes                   Bebidas
## 4175     2761          Abarrotes                   Bebidas
## 4176     2761          Abarrotes                   Bebidas
## 4177     2762          Abarrotes    Lacteos y Refrigerados
## 4178     2763          Abarrotes    Lacteos y Refrigerados
## 4179     2763          Abarrotes      Te, Chocolate y Café
## 4180     2764          Abarrotes                   Bebidas
## 4181     2766          Abarrotes                   Bebidas
## 4182     2768          Abarrotes                   Bebidas
## 4183     2769          Abarrotes    Lacteos y Refrigerados
## 4184     2771          Abarrotes    Lacteos y Refrigerados
## 4185     2772          Abarrotes    Lacteos y Refrigerados
## 4186     2773          Abarrotes                   Bebidas
## 4187     2773          Abarrotes                  Dulcería
## 4188     2774          Abarrotes                   Bebidas
## 4189     2774          Abarrotes                   Bebidas
## 4190     2776          Abarrotes                   Bebidas
## 4191     2777          Abarrotes                   Bebidas
## 4192     2778          Abarrotes                   Bebidas
## 4193     2778          Abarrotes               Desechables
## 4194     2778          Abarrotes                   Bebidas
## 4195     2778          Abarrotes    Lacteos y Refrigerados
## 4196     2779          Abarrotes                   Bebidas
## 4197     2780          Abarrotes                   Bebidas
## 4198     2780          Abarrotes                   Bebidas
## 4199     2781          Abarrotes                   Bebidas
## 4200     2783          Abarrotes                   Bebidas
## 4201     2783          Abarrotes                   Latería
## 4202     2783          Abarrotes                   Bebidas
## 4203     2784          Abarrotes                   Bebidas
## 4204     2785          Abarrotes                   Botanas
## 4205     2785          Abarrotes                   Bebidas
## 4206     2785          Abarrotes                  Dulcería
## 4207     2786          Abarrotes        Limpieza del Hogar
## 4208     2786          Abarrotes        Limpieza del Hogar
## 4209     2786          Abarrotes                   Botanas
## 4210     2787          Abarrotes    Lacteos y Refrigerados
## 4211     2787          Abarrotes                  Galletas
## 4212     2789          Abarrotes                   Bebidas
## 4213     2789          Abarrotes                   Bebidas
## 4214     2790          Abarrotes      Salsas y Sazonadores
## 4215     2790          Abarrotes        Limpieza del Hogar
## 4216     2790          Abarrotes                   Cerveza
## 4217     2790          Abarrotes         Granos y Semillas
## 4218     2791          Abarrotes            Pan y Tortilla
## 4219     2792          Abarrotes                   Bebidas
## 4220     2793          Abarrotes                   Bebidas
## 4221     2793          Abarrotes                   Bebidas
## 4222     2794          Abarrotes                   Bebidas
## 4223     2794          Abarrotes                   Bebidas
## 4224     2794          Abarrotes         Granos y Semillas
## 4225     2795          Abarrotes                   Bebidas
## 4226     2796          Abarrotes                   Bebidas
## 4227     2796          Abarrotes                   Cerveza
## 4228     2797          Abarrotes                   Botanas
## 4229     2798          Abarrotes                   Bebidas
## 4230     2798          Abarrotes         Velas y Veladoras
## 4231     2799          Abarrotes                  Dulcería
## 4232     2800          Abarrotes                   Bebidas
## 4233     2801          Abarrotes            Sopas y Pastas
## 4234     2801          Abarrotes                   Cerveza
## 4235     2802          Abarrotes                   Bebidas
## 4236     2804          Abarrotes                   Botanas
## 4237     2804          Abarrotes                   Bebidas
## 4238     2804          Abarrotes                   Bebidas
## 4239     2805          Abarrotes                   Bebidas
## 4240     2806          Abarrotes                   Bebidas
## 4241     2807          Abarrotes                   Bebidas
## 4242     2807          Abarrotes                   Bebidas
## 4243     2807          Abarrotes                   Bebidas
## 4244     2808          Abarrotes                   Bebidas
## 4245     2808          Abarrotes    Lacteos y Refrigerados
## 4246     2809          Abarrotes                   Botanas
## 4247     2809          Abarrotes                   Botanas
## 4248     2809          Abarrotes                   Botanas
## 4249     2809          Abarrotes                   Bebidas
## 4250     2810          Abarrotes                  Galletas
## 4251     2810          Abarrotes                   Bebidas
## 4252     2810          Abarrotes                   Bebidas
## 4253     2811          Abarrotes                   Bebidas
## 4254     2812          Abarrotes                   Bebidas
## 4255     2812          Abarrotes                   Botanas
## 4256     2812          Abarrotes                   Botanas
## 4257     2812          Abarrotes                   Latería
## 4258     2812          Abarrotes                   Bebidas
## 4259     2813          Abarrotes                   Botanas
## 4260     2813          Abarrotes                   Botanas
## 4261     2813          Abarrotes                   Bebidas
## 4262     2814          Abarrotes                   Bebidas
## 4263     2816          Abarrotes                   Bebidas
## 4264     2817          Abarrotes                   Bebidas
## 4265     2817          Abarrotes                   Bebidas
## 4266     2818          Abarrotes                   Bebidas
## 4267     2819          Abarrotes                  Especias
## 4268     2820          Abarrotes                   Botanas
## 4269     2822          Abarrotes                   Bebidas
## 4270     2822          Abarrotes               Desechables
## 4271     2822          Abarrotes               Desechables
## 4272     2822          Abarrotes                   Bebidas
## 4273     2822          Abarrotes                   Bebidas
## 4274     2822          Abarrotes               Desechables
## 4275     2823          Abarrotes                   Botanas
## 4276     2823          Abarrotes                   Bebidas
## 4277     2824          Abarrotes                  Galletas
## 4278     2825          Abarrotes                  Cigarros
## 4279     2826          Abarrotes            Pan y Tortilla
## 4280     2826          Abarrotes            Pan y Tortilla
## 4281     2826          Abarrotes        Limpieza del Hogar
## 4282     2826          Abarrotes    Lacteos y Refrigerados
## 4283     2826          Abarrotes        Limpieza del Hogar
## 4284     2827          Abarrotes            Pan y Tortilla
## 4285     2828          Abarrotes                   Botanas
## 4286     2828          Abarrotes                   Botanas
## 4287     2828          Abarrotes                   Bebidas
## 4288     2828          Abarrotes                   Botanas
## 4289     2828          Abarrotes          Cuidado Personal
## 4290     2829          Abarrotes                   Bebidas
## 4291     2829          Abarrotes                   Bebidas
## 4292     2830          Abarrotes                   Bebidas
## 4293     2830          Abarrotes                   Bebidas
## 4294     2830          Abarrotes               Desechables
## 4295     2832          Abarrotes        Limpieza del Hogar
## 4296     2832          Abarrotes                   Bebidas
## 4297     2832          Abarrotes    Lacteos y Refrigerados
## 4298     2833          Abarrotes                   Bebidas
## 4299     2833          Abarrotes                   Bebidas
## 4300     2834          Abarrotes                   Bebidas
## 4301     2835          Abarrotes                   Botanas
## 4302     2835          Abarrotes                   Botanas
## 4303     2835          Abarrotes                   Bebidas
## 4304     2835          Abarrotes                  Especias
## 4305     2835          Abarrotes                   Bebidas
## 4306     2836          Abarrotes                  Especias
## 4307     2836          Abarrotes                   Bebidas
## 4308     2837          Abarrotes                   Bebidas
## 4309     2838          Abarrotes                   Bebidas
## 4310     2839          Abarrotes                   Bebidas
## 4311     2839          Abarrotes                  Cigarros
## 4312     2841          Abarrotes                   Botanas
## 4313     2841          Abarrotes                   Bebidas
## 4314     2841          Abarrotes                  Aderezos
## 4315     2842          Abarrotes                   Bebidas
## 4316     2843          Abarrotes                   Botanas
## 4317     2844          Abarrotes                   Bebidas
## 4318     2845          Abarrotes                   Botanas
## 4319     2845          Abarrotes                  Especias
## 4320     2846          Abarrotes            Sopas y Pastas
## 4321     2846          Abarrotes            Sopas y Pastas
## 4322     2847          Abarrotes                   Bebidas
## 4323     2848          Abarrotes                   Cerveza
## 4324     2848          Abarrotes                  Cigarros
## 4325     2848          Abarrotes                   Bebidas
## 4326     2849          Abarrotes            Pan y Tortilla
## 4327     2849          Abarrotes                   Botanas
## 4328     2849          Abarrotes                   Bebidas
## 4329     2850          Abarrotes                   Bebidas
## 4330     2851          Abarrotes                   Botanas
## 4331     2851          Abarrotes                   Botanas
## 4332     2851          Abarrotes                   Botanas
## 4333     2851          Abarrotes                   Botanas
## 4334     2851          Abarrotes                   Bebidas
## 4335     2851          Abarrotes                   Botanas
## 4336     2851          Abarrotes                   Botanas
## 4337     2851          Abarrotes                   Bebidas
## 4338     2851          Abarrotes                   Bebidas
## 4339     2852          Abarrotes                   Botanas
## 4340     2852          Abarrotes                   Bebidas
## 4341     2853          Abarrotes                  Cigarros
## 4342     2853          Abarrotes                  Cigarros
## 4343     2856          Abarrotes                   Botanas
## 4344     2857          Abarrotes        Limpieza del Hogar
## 4345     2857          Abarrotes        Limpieza del Hogar
## 4346     2857          Abarrotes                   Bebidas
## 4347     2859          Abarrotes    Lacteos y Refrigerados
## 4348     2861          Abarrotes    Lacteos y Refrigerados
## 4349     2861          Abarrotes                   Bebidas
## 4350     2863          Abarrotes                   Bebidas
## 4351     2864          Abarrotes    Lacteos y Refrigerados
## 4352     2864          Abarrotes                   Bebidas
## 4353     2865          Abarrotes                   Bebidas
## 4354     2868          Abarrotes            Sopas y Pastas
## 4355     2868          Abarrotes                   Bebidas
## 4356     2870          Abarrotes    Lacteos y Refrigerados
## 4357     2870          Abarrotes                  Galletas
## 4358     2870          Abarrotes    Lacteos y Refrigerados
## 4359     2870          Abarrotes    Lacteos y Refrigerados
## 4360     2870          Abarrotes                   Bebidas
## 4361     2871          Abarrotes                   Botanas
## 4362     2871          Abarrotes                   Bebidas
## 4363     2873          Abarrotes                   Bebidas
## 4364     2873          Abarrotes                   Bebidas
## 4365     2875          Abarrotes                   Bebidas
## 4366     2876          Abarrotes                   Bebidas
## 4367     2877          Abarrotes                   Latería
## 4368     2877          Abarrotes                   Bebidas
## 4369     2878          Abarrotes            Pan y Tortilla
## 4370     2878          Abarrotes                   Bebidas
## 4371     2881          Abarrotes                   Botanas
## 4372     2881          Abarrotes                   Botanas
## 4373     2882          Abarrotes                   Botanas
## 4374     2882          Abarrotes            Sopas y Pastas
## 4375     2882          Abarrotes                   Bebidas
## 4376     2882          Abarrotes          Cuidado Personal
## 4377     2882          Abarrotes                  Dulcería
## 4378     2882          Abarrotes                   Botanas
## 4379     2882          Abarrotes                  Dulcería
## 4380     2883          Abarrotes                   Bebidas
## 4381     2883          Abarrotes                   Bebidas
## 4382     2885          Abarrotes                   Botanas
## 4383     2886          Abarrotes    Lacteos y Refrigerados
## 4384     2886          Abarrotes                   Bebidas
## 4385     2886          Abarrotes                   Cerveza
## 4386     2886          Abarrotes                   Bebidas
## 4387     2888          Abarrotes                   Bebidas
## 4388     2888          Abarrotes                   Botanas
## 4389     2889          Abarrotes                   Bebidas
## 4390     2891          Abarrotes                  Galletas
## 4391     2891          Abarrotes                   Bebidas
## 4392     2892          Abarrotes                   Botanas
## 4393     2892          Abarrotes                   Bebidas
## 4394     2893          Abarrotes                   Botanas
## 4395     2893          Abarrotes                   Bebidas
## 4396     2894          Abarrotes                   Bebidas
## 4397     2895          Abarrotes                   Bebidas
## 4398     2896          Abarrotes                   Bebidas
## 4399     2897          Abarrotes            Pan y Tortilla
## 4400     2897          Abarrotes                   Botanas
## 4401     2898          Abarrotes                   Bebidas
## 4402     2899          Abarrotes                   Botanas
## 4403     2899          Abarrotes                   Botanas
## 4404     2899          Abarrotes    Lacteos y Refrigerados
## 4405     2900          Abarrotes                   Bebidas
## 4406     2900          Abarrotes                   Botanas
## 4407     2900          Abarrotes    Lacteos y Refrigerados
## 4408     2901          Abarrotes                   Bebidas
## 4409     2902          Abarrotes                   Botanas
## 4410     2903          Abarrotes        Limpieza del Hogar
## 4411     2904          Abarrotes                   Botanas
## 4412     2904          Abarrotes                   Bebidas
## 4413     2905          Abarrotes                   Bebidas
## 4414     2907          Abarrotes    Lacteos y Refrigerados
## 4415     2907          Abarrotes                   Botanas
## 4416     2908          Abarrotes                   Botanas
## 4417     2908          Abarrotes                   Bebidas
## 4418     2908          Abarrotes                   Botanas
## 4419     2909          Abarrotes                   Botanas
## 4420     2910          Abarrotes                   Botanas
## 4421     2910          Abarrotes                   Botanas
## 4422     2910          Abarrotes    Lacteos y Refrigerados
## 4423     2910          Abarrotes C. Frías y Salchichonería
## 4424     2910          Abarrotes                   Bebidas
## 4425     2911          Abarrotes        Limpieza del Hogar
## 4426     2911          Abarrotes        Limpieza del Hogar
## 4427     2912          Abarrotes                  Galletas
## 4428     2913          Abarrotes                   Bebidas
## 4429     2915          Abarrotes                  Especias
## 4430     2916          Abarrotes                   Bebidas
## 4431     2918          Abarrotes                   Bebidas
## 4432     2919          Abarrotes               Desechables
## 4433     2922          Abarrotes                   Botanas
## 4434     2922          Abarrotes                   Botanas
## 4435     2922          Abarrotes                   Botanas
## 4436     2923          Abarrotes      Salsas y Sazonadores
## 4437     2923          Abarrotes                   Latería
## 4438     2924          Abarrotes                   Botanas
## 4439     2925          Abarrotes                   Bebidas
## 4440     2926          Abarrotes                   Botanas
## 4441     2926          Abarrotes                   Botanas
## 4442     2926          Abarrotes                   Botanas
## 4443     2926          Abarrotes                   Bebidas
## 4444     2926          Abarrotes                   Bebidas
## 4445     2927          Abarrotes          Cuidado Personal
## 4446     2928          Abarrotes                   Botanas
## 4447     2928          Abarrotes                   Bebidas
## 4448     2928          Abarrotes                   Bebidas
## 4449     2928          Abarrotes                  Dulcería
## 4450     2930          Abarrotes                   Bebidas
## 4451     2931          Abarrotes                   Botanas
## 4452     2931          Abarrotes                   Bebidas
## 4453     2932          Abarrotes                   Bebidas
## 4454     2932          Abarrotes                   Botanas
## 4455     2932          Abarrotes                   Bebidas
## 4456     2932          Abarrotes                   Bebidas
## 4457     2934          Abarrotes                   Bebidas
## 4458     2934          Abarrotes                  Dulcería
## 4459     2934          Abarrotes                   Bebidas
## 4460     2935          Abarrotes                   Bebidas
## 4461     2936          Abarrotes                   Bebidas
## 4462     2937          Abarrotes                   Botanas
## 4463     2937          Abarrotes                  Aderezos
## 4464     2937          Abarrotes            Pan y Tortilla
## 4465     2937          Abarrotes                  Dulcería
## 4466     2937          Abarrotes                  Dulcería
## 4467     2938          Abarrotes                  Especias
## 4468     2938          Abarrotes        Limpieza del Hogar
## 4469     2939          Abarrotes                   Bebidas
## 4470     2939          Abarrotes                   Bebidas
## 4471     2939          Abarrotes                   Bebidas
## 4472     2939          Abarrotes                   Bebidas
## 4473     2940          Abarrotes                   Botanas
## 4474     2941          Abarrotes                  Aderezos
## 4475     2942          Abarrotes                  Cigarros
## 4476     2943          Abarrotes                   Bebidas
## 4477     2945          Abarrotes                   Bebidas
## 4478     2946          Abarrotes                   Cerveza
## 4479     2946          Abarrotes                   Bebidas
## 4480     2947          Abarrotes                   Botanas
## 4481     2947          Abarrotes            Pan y Tortilla
## 4482     2947          Abarrotes                   Bebidas
## 4483     2948          Abarrotes                   Bebidas
## 4484     2948          Abarrotes      Salsas y Sazonadores
## 4485     2948          Abarrotes                   Bebidas
## 4486     2948          Abarrotes          Cuidado Personal
## 4487     2948          Abarrotes                   Bebidas
## 4488     2949          Abarrotes                   Bebidas
## 4489     2949          Abarrotes                  Especias
## 4490     2950          Abarrotes                   Bebidas
## 4491     2950          Abarrotes    Lacteos y Refrigerados
## 4492     2950          Abarrotes                   Bebidas
## 4493     2950          Abarrotes                   Cerveza
## 4494     2950          Abarrotes                   Botanas
## 4495     2950          Abarrotes                   Bebidas
## 4496     2951          Abarrotes                   Cerveza
## 4497     2952          Abarrotes                  Especias
## 4498     2953          Abarrotes                  Especias
## 4499     2954          Abarrotes                   Bebidas
## 4500     2955          Abarrotes      Salsas y Sazonadores
## 4501     2957          Abarrotes                   Botanas
## 4502     2957          Abarrotes                   Botanas
## 4503     2957          Abarrotes                   Botanas
## 4504     2957          Abarrotes                   Bebidas
## 4505     2958          Abarrotes            Pan y Tortilla
## 4506     2960          Abarrotes                   Bebidas
## 4507     2960          Abarrotes                   Botanas
## 4508     2960          Abarrotes                   Bebidas
## 4509     2962          Abarrotes    Lacteos y Refrigerados
## 4510     2962          Abarrotes    Lacteos y Refrigerados
## 4511     2962          Abarrotes                   Bebidas
## 4512     2963          Abarrotes                   Latería
## 4513     2963          Abarrotes                   Bebidas
## 4514     2963          Abarrotes    Lacteos y Refrigerados
## 4515     2964          Abarrotes                   Bebidas
## 4516     2964          Abarrotes                   Bebidas
## 4517     2965          Abarrotes        Limpieza del Hogar
## 4518     2966          Abarrotes                   Botanas
## 4519     2966          Abarrotes                   Cerveza
## 4520     2969          Abarrotes                   Botanas
## 4521     2969          Abarrotes                   Botanas
## 4522     2969          Abarrotes                   Botanas
## 4523     2969          Abarrotes                   Bebidas
## 4524     2970          Abarrotes                   Bebidas
## 4525     2971          Abarrotes                   Latería
## 4526     2971          Abarrotes                   Bebidas
## 4527     2971          Abarrotes                  Especias
## 4528     2972          Abarrotes      Salsas y Sazonadores
## 4529     2973          Abarrotes                  Galletas
## 4530     2973          Abarrotes                   Botanas
## 4531     2975          Abarrotes                    Aceite
## 4532     2976          Abarrotes                  Especias
## 4533     2976          Abarrotes                   Bebidas
## 4534     2976          Abarrotes                   Bebidas
## 4535     2976          Abarrotes         Granos y Semillas
## 4536     2979          Abarrotes                   Botanas
## 4537     2980          Abarrotes                   Bebidas
## 4538     2981          Abarrotes                   Bebidas
## 4539     2983          Abarrotes                   Bebidas
## 4540     2983          Abarrotes                  Especias
## 4541     2985          Abarrotes                   Botanas
## 4542     2988          Abarrotes        Limpieza del Hogar
## 4543     2988          Abarrotes        Limpieza del Hogar
## 4544     2989          Abarrotes            Pan y Tortilla
## 4545     2989          Abarrotes                   Latería
## 4546     2989          Abarrotes                  Aderezos
## 4547     2989          Abarrotes    Lacteos y Refrigerados
## 4548     2990          Abarrotes            Sopas y Pastas
## 4549     2990          Abarrotes                   Bebidas
## 4550     2991          Abarrotes                   Bebidas
## 4551     2992          Abarrotes                   Botanas
## 4552     2993          Abarrotes                   Latería
## 4553     2993          Abarrotes                   Bebidas
## 4554     2994          Abarrotes                   Bebidas
## 4555     2995          Abarrotes                   Botanas
## 4556     2995          Abarrotes                   Botanas
## 4557     2995          Abarrotes                   Botanas
## 4558     2995          Abarrotes                   Botanas
## 4559     2995          Abarrotes                   Bebidas
## 4560     2996          Abarrotes                  Galletas
## 4561     2997          Abarrotes                   Botanas
## 4562     2997          Abarrotes                   Bebidas
## 4563     2998          Abarrotes                   Bebidas
## 4564     2998          Abarrotes    Lacteos y Refrigerados
## 4565     2999          Abarrotes        Limpieza del Hogar
## 4566     3001          Abarrotes        Limpieza del Hogar
## 4567     3002          Abarrotes                   Botanas
## 4568     3002          Abarrotes                   Bebidas
## 4569     3003          Abarrotes                   Bebidas
## 4570     3003          Abarrotes   Alimentos para Mascotas
## 4571     3004          Abarrotes C. Frías y Salchichonería
## 4572     3004          Abarrotes                   Bebidas
## 4573     3005          Abarrotes                   Bebidas
## 4574     3006          Abarrotes        Limpieza del Hogar
## 4575     3007          Abarrotes                  Mantecas
## 4576     3008          Abarrotes                   Bebidas
## 4577     3009          Abarrotes            Pan y Tortilla
## 4578     3009          Abarrotes    Lacteos y Refrigerados
## 4579     3010          Abarrotes                   Bebidas
## 4580     3011          Abarrotes                   Cerveza
## 4581     3013          Abarrotes                   Bebidas
## 4582     3014          Abarrotes                   Bebidas
## 4583     3015          Abarrotes                  Galletas
## 4584     3015          Abarrotes                   Bebidas
## 4585     3015          Abarrotes                   Bebidas
## 4586     3015          Abarrotes                   Bebidas
## 4587     3015          Abarrotes    Lacteos y Refrigerados
## 4588     3017          Abarrotes            Pan y Tortilla
## 4589     3017          Abarrotes                   Latería
## 4590     3017          Abarrotes                   Bebidas
## 4591     3017          Abarrotes                  Aderezos
## 4592     3021          Abarrotes                   Bebidas
## 4593     3021           Mercería                    Varios
## 4594     3023          Abarrotes                  Galletas
## 4595     3023          Abarrotes                  Dulcería
## 4596     3024          Abarrotes                  Galletas
## 4597     3024          Abarrotes            Pan y Tortilla
## 4598     3024          Abarrotes    Lacteos y Refrigerados
## 4599     3025          Abarrotes                   Bebidas
## 4600     3026          Abarrotes                   Bebidas
## 4601     3027          Abarrotes                   Botanas
## 4602     3027          Abarrotes                   Bebidas
## 4603     3028          Abarrotes    Lacteos y Refrigerados
## 4604     3030          Abarrotes                   Bebidas
## 4605     3031          Abarrotes                  Cigarros
## 4606     3032          Abarrotes                  Dulcería
## 4607     3032          Abarrotes                   Bebidas
## 4608     3033          Abarrotes                   Bebidas
## 4609     3033          Abarrotes            Pan y Tortilla
## 4610     3035          Abarrotes         Velas y Veladoras
## 4611     3035          Abarrotes        Limpieza del Hogar
## 4612     3037          Abarrotes                   Botanas
## 4613     3037          Abarrotes                   Bebidas
## 4614     3038          Abarrotes                   Bebidas
## 4615     3039          Abarrotes        Limpieza del Hogar
## 4616     3039          Abarrotes                   Botanas
## 4617     3040          Abarrotes    Lacteos y Refrigerados
## 4618     3041          Abarrotes                   Botanas
## 4619     3041          Abarrotes                   Bebidas
## 4620     3042          Abarrotes                  Dulcería
## 4621     3043          Abarrotes                   Latería
## 4622     3044          Abarrotes            Pan y Tortilla
## 4623     3045          Abarrotes                   Bebidas
## 4624     3046          Abarrotes                   Bebidas
## 4625     3046          Abarrotes                  Dulcería
## 4626     3047          Abarrotes                   Bebidas
## 4627     3047          Abarrotes                   Bebidas
## 4628     3047          Abarrotes                   Bebidas
## 4629     3049          Abarrotes                  Cigarros
## 4630     3050          Abarrotes                   Bebidas
## 4631     3050          Abarrotes                   Bebidas
## 4632     3050          Abarrotes        Limpieza del Hogar
## 4633     3051          Abarrotes                   Botanas
## 4634     3052          Abarrotes C. Frías y Salchichonería
## 4635     3052          Abarrotes                   Bebidas
## 4636     3055          Abarrotes                   Bebidas
## 4637     3055          Abarrotes                   Bebidas
## 4638     3055          Abarrotes                   Bebidas
## 4639     3056          Abarrotes                   Bebidas
## 4640     3057          Abarrotes    Lacteos y Refrigerados
## 4641     3060          Abarrotes            Pan y Tortilla
## 4642     3060         Ferretería                Pegamentos
## 4643     3061          Abarrotes    Lacteos y Refrigerados
## 4644     3061          Abarrotes                  Cigarros
## 4645     3062          Abarrotes                   Latería
## 4646     3062          Abarrotes                   Bebidas
## 4647     3063          Abarrotes               Desechables
## 4648     3064          Abarrotes                   Bebidas
## 4649     3066          Abarrotes                   Cerveza
## 4650     3066          Abarrotes                   Bebidas
## 4651     3066          Abarrotes C. Frías y Salchichonería
## 4652     3067          Abarrotes                  Cigarros
## 4653     3068          Abarrotes                   Botanas
## 4654     3069          Abarrotes                   Botanas
## 4655     3070          Abarrotes                   Bebidas
## 4656     3070          Abarrotes                   Bebidas
## 4657     3071          Abarrotes            Pan y Tortilla
## 4658     3073          Abarrotes        Limpieza del Hogar
## 4659     3073          Abarrotes                   Bebidas
## 4660     3074          Abarrotes                  Cigarros
## 4661     3075          Abarrotes                   Bebidas
## 4662     3075          Abarrotes        Limpieza del Hogar
## 4663     3076          Abarrotes            Pan y Tortilla
## 4664     3077          Abarrotes                   Botanas
## 4665     3077          Abarrotes                   Botanas
## 4666     3077          Abarrotes                   Bebidas
## 4667     3078          Abarrotes                   Bebidas
## 4668     3078          Abarrotes                   Bebidas
## 4669     3078          Abarrotes                   Bebidas
## 4670     3079          Abarrotes      Salsas y Sazonadores
## 4671     3079          Abarrotes                   Bebidas
## 4672     3080 Bebes e Infantiles                Alimentos 
## 4673     3083          Abarrotes                   Bebidas
## 4674     3084          Abarrotes                   Botanas
## 4675     3084          Abarrotes          Cuidado Personal
## 4676     3085          Abarrotes                   Bebidas
## 4677     3085          Abarrotes                   Bebidas
## 4678     3088          Abarrotes                  Cereales
## 4679     3088          Abarrotes                   Bebidas
## 4680     3088          Abarrotes    Lacteos y Refrigerados
## 4681     3089          Abarrotes                  Cigarros
## 4682     3091          Abarrotes                   Bebidas
## 4683     3093          Abarrotes                  Cigarros
## 4684     3095          Abarrotes                   Bebidas
## 4685     3095          Abarrotes                   Bebidas
## 4686     3095          Abarrotes                   Botanas
## 4687     3095          Abarrotes         Granos y Semillas
## 4688     3096          Abarrotes                   Bebidas
## 4689     3096          Abarrotes                  Dulcería
## 4690     3097          Abarrotes                   Botanas
## 4691     3097          Abarrotes    Lacteos y Refrigerados
## 4692     3097          Abarrotes                   Bebidas
## 4693     3098          Abarrotes                   Botanas
## 4694     3099          Abarrotes                   Bebidas
## 4695     3100          Abarrotes                   Cerveza
## 4696     3101          Abarrotes    Lacteos y Refrigerados
## 4697     3101          Abarrotes            Pan y Tortilla
## 4698     3103          Abarrotes                   Bebidas
## 4699     3106          Abarrotes                   Bebidas
## 4700     3106          Abarrotes                  Aderezos
## 4701     3106          Abarrotes                   Bebidas
## 4702     3106          Abarrotes                   Bebidas
## 4703     3109          Abarrotes    Lacteos y Refrigerados
## 4704     3109          Abarrotes                  Dulcería
## 4705     3110          Abarrotes                   Botanas
## 4706     3110          Abarrotes                   Bebidas
## 4707     3112          Abarrotes                   Bebidas
## 4708     3113          Abarrotes                   Bebidas
## 4709     3113          Abarrotes    Lacteos y Refrigerados
## 4710     3113          Abarrotes                  Especias
## 4711     3113          Abarrotes                   Bebidas
## 4712     3114          Abarrotes                   Cerveza
## 4713     3115          Abarrotes                   Botanas
## 4714     3115          Abarrotes                   Botanas
## 4715     3115          Abarrotes                   Botanas
## 4716     3116          Abarrotes            Sopas y Pastas
## 4717     3116          Abarrotes                   Latería
## 4718     3116          Abarrotes    Lacteos y Refrigerados
## 4719     3117          Abarrotes                   Bebidas
## 4720     3118          Abarrotes            Sopas y Pastas
## 4721     3119 Bebes e Infantiles                   Pañales
## 4722     3119          Abarrotes      Salsas y Sazonadores
## 4723     3119          Abarrotes                   Bebidas
## 4724     3121          Abarrotes             Azúcar y Miel
## 4725     3122          Abarrotes    Lacteos y Refrigerados
## 4726     3123          Abarrotes            Pan y Tortilla
## 4727     3123          Abarrotes                  Galletas
## 4728     3123          Abarrotes    Lacteos y Refrigerados
## 4729     3124          Abarrotes         Velas y Veladoras
## 4730     3124          Abarrotes    Lacteos y Refrigerados
## 4731     3125          Abarrotes            Pan y Tortilla
## 4732     3125          Abarrotes    Lacteos y Refrigerados
## 4733     3125          Abarrotes          Cuidado Personal
## 4734     3125          Abarrotes         Granos y Semillas
## 4735     3126          Abarrotes        Limpieza del Hogar
## 4736     3126          Abarrotes            Pan y Tortilla
## 4737     3126          Abarrotes          Cuidado Personal
## 4738     3127          Abarrotes                  Galletas
## 4739     3127          Abarrotes                   Bebidas
## 4740     3127          Abarrotes                   Bebidas
## 4741     3127          Abarrotes                   Bebidas
## 4742     3128          Abarrotes        Limpieza del Hogar
## 4743     3129          Abarrotes                   Bebidas
## 4744     3130          Abarrotes                   Bebidas
## 4745     3131          Abarrotes    Harinas y Complementos
## 4746     3131          Abarrotes                   Bebidas
## 4747     3131          Abarrotes                   Bebidas
## 4748     3132          Abarrotes          Cuidado Personal
## 4749     3132          Abarrotes                   Bebidas
## 4750     3133          Abarrotes                   Bebidas
## 4751     3134          Abarrotes                   Bebidas
## 4752     3134          Abarrotes                   Bebidas
## 4753     3135          Abarrotes                  Galletas
## 4754     3135          Abarrotes                   Bebidas
## 4755     3136          Abarrotes            Pan y Tortilla
## 4756     3137          Abarrotes            Sopas y Pastas
## 4757     3137          Abarrotes            Pan y Tortilla
## 4758     3137          Abarrotes                   Bebidas
## 4759     3137          Abarrotes                   Bebidas
## 4760     3138          Abarrotes                  Especias
## 4761     3139          Abarrotes                  Cereales
## 4762     3139          Abarrotes                  Galletas
## 4763     3139          Abarrotes                   Bebidas
## 4764     3139          Abarrotes                   Bebidas
## 4765     3140          Abarrotes            Pan y Tortilla
## 4766     3140          Abarrotes                   Bebidas
## 4767     3140          Abarrotes                   Bebidas
## 4768     3144          Abarrotes                   Bebidas
## 4769     3144          Abarrotes                  Cigarros
## 4770     3144          Abarrotes                  Cigarros
## 4771     3145          Abarrotes            Pan y Tortilla
## 4772     3146          Abarrotes      Salsas y Sazonadores
## 4773     3147          Abarrotes                  Galletas
## 4774     3147          Abarrotes      Te, Chocolate y Café
## 4775     3147          Abarrotes    Lacteos y Refrigerados
## 4776     3148          Abarrotes                   Bebidas
## 4777     3148          Abarrotes                   Bebidas
## 4778     3150          Abarrotes                   Bebidas
## 4779     3151          Abarrotes                   Bebidas
## 4780     3152          Abarrotes                  Especias
## 4781     3154          Abarrotes                  Cigarros
## 4782     3155          Abarrotes                   Bebidas
## 4783     3157          Abarrotes                   Bebidas
## 4784     3157          Abarrotes                   Bebidas
## 4785     3158          Abarrotes                   Latería
## 4786     3158          Abarrotes                   Bebidas
## 4787     3159          Abarrotes                   Botanas
## 4788     3159          Abarrotes                   Bebidas
## 4789     3159          Abarrotes                   Bebidas
## 4790     3160          Abarrotes      Salsas y Sazonadores
## 4791     3160          Abarrotes      Te, Chocolate y Café
## 4792     3161          Abarrotes        Limpieza del Hogar
## 4793     3161          Abarrotes                   Bebidas
## 4794     3163          Abarrotes                   Bebidas
## 4795     3164          Abarrotes                  Especias
## 4796     3164          Abarrotes          Cuidado Personal
## 4797     3165          Abarrotes                  Dulcería
## 4798     3167          Abarrotes        Limpieza del Hogar
## 4799     3168          Abarrotes                   Cerveza
## 4800     3168          Abarrotes                   Botanas
## 4801     3168          Abarrotes                   Bebidas
## 4802     3169          Abarrotes    Lacteos y Refrigerados
## 4803     3171          Abarrotes            Sopas y Pastas
## 4804     3171          Abarrotes                   Bebidas
## 4805     3172          Abarrotes                   Bebidas
## 4806     3172          Abarrotes                   Bebidas
## 4807     3172          Abarrotes                   Bebidas
## 4808     3173          Abarrotes                   Bebidas
## 4809     3173          Abarrotes                  Mantecas
## 4810     3173          Abarrotes                   Bebidas
## 4811     3173          Abarrotes                   Bebidas
## 4812     3174          Abarrotes        Limpieza del Hogar
## 4813     3174          Abarrotes                  Cigarros
## 4814     3175          Abarrotes      Salsas y Sazonadores
## 4815     3175          Abarrotes            Pan y Tortilla
## 4816     3175          Abarrotes                   Bebidas
## 4817     3175          Abarrotes         Granos y Semillas
## 4818     3175          Abarrotes      Salsas y Sazonadores
## 4819     3176          Abarrotes                   Bebidas
## 4820     3177          Abarrotes                  Galletas
## 4821     3179          Abarrotes            Pan y Tortilla
## 4822     3180          Abarrotes                   Bebidas
## 4823     3181          Abarrotes                   Bebidas
## 4824     3181          Abarrotes                   Bebidas
## 4825     3182          Abarrotes                  Cigarros
## 4826     3183          Abarrotes                  Cigarros
## 4827     3184          Abarrotes                   Bebidas
## 4828     3185          Abarrotes        Limpieza del Hogar
## 4829     3186          Abarrotes                   Bebidas
## 4830     3187          Abarrotes                   Bebidas
## 4831     3187          Abarrotes                   Bebidas
## 4832     3188          Abarrotes                  Cigarros
## 4833     3189          Abarrotes                   Bebidas
## 4834     3191          Abarrotes    Lacteos y Refrigerados
## 4835     3191          Abarrotes                   Latería
## 4836     3192          Abarrotes                   Bebidas
## 4837     3192          Abarrotes                   Bebidas
## 4838     3192          Abarrotes                  Cigarros
## 4839     3192          Abarrotes                   Bebidas
## 4840     3193          Abarrotes                   Bebidas
## 4841     3193          Abarrotes                  Galletas
## 4842     3193          Abarrotes            Pan y Tortilla
## 4843     3193          Abarrotes        Limpieza del Hogar
## 4844     3193          Abarrotes                  Especias
## 4845     3193          Abarrotes                  Especias
## 4846     3194          Abarrotes                   Bebidas
## 4847     3194          Abarrotes                   Bebidas
## 4848     3194          Abarrotes                   Bebidas
## 4849     3195          Abarrotes            Pan y Tortilla
## 4850     3196          Abarrotes    Lacteos y Refrigerados
## 4851     3196          Abarrotes    Lacteos y Refrigerados
## 4852     3197          Abarrotes                   Bebidas
## 4853     3199          Abarrotes                   Bebidas
## 4854     3199          Abarrotes                   Botanas
## 4855     3200          Abarrotes                  Galletas
## 4856     3200          Abarrotes                   Bebidas
## 4857     3201          Abarrotes            Pan y Tortilla
## 4858     3201          Abarrotes            Pan y Tortilla
## 4859     3202          Abarrotes                   Bebidas
## 4860     3202          Abarrotes                   Bebidas
## 4861     3202          Abarrotes                   Bebidas
## 4862     3203          Abarrotes                   Botanas
## 4863     3203          Abarrotes                   Latería
## 4864     3204          Abarrotes                   Bebidas
## 4865     3204          Abarrotes                   Bebidas
## 4866     3204          Abarrotes                  Dulcería
## 4867     3204          Abarrotes                  Dulcería
## 4868     3205          Abarrotes   Alimentos para Mascotas
## 4869     3206          Abarrotes                   Bebidas
## 4870     3207          Abarrotes                   Bebidas
## 4871     3208          Abarrotes                   Botanas
## 4872     3208          Abarrotes                   Bebidas
## 4873     3209          Abarrotes                   Bebidas
## 4874     3209          Abarrotes                   Bebidas
## 4875     3210          Abarrotes            Pan y Tortilla
## 4876     3210          Abarrotes                  Especias
## 4877     3211          Abarrotes                   Bebidas
## 4878     3211          Abarrotes        Limpieza del Hogar
## 4879     3212          Abarrotes        Limpieza del Hogar
## 4880     3212          Abarrotes                  Dulcería
## 4881     3214          Abarrotes                   Bebidas
## 4882     3214          Abarrotes                   Latería
## 4883     3214          Abarrotes                   Bebidas
## 4884     3215          Abarrotes                   Botanas
## 4885     3215          Abarrotes                   Bebidas
## 4886     3216          Abarrotes                   Bebidas
## 4887     3217          Abarrotes                   Bebidas
## 4888     3217          Abarrotes                   Bebidas
## 4889     3218          Abarrotes                   Botanas
## 4890     3219          Abarrotes                   Bebidas
## 4891     3220          Abarrotes            Pan y Tortilla
## 4892     3222          Abarrotes                   Bebidas
## 4893     3222          Abarrotes                   Bebidas
## 4894     3223          Abarrotes                   Bebidas
## 4895     3223          Abarrotes                   Botanas
## 4896     3223          Abarrotes                   Bebidas
## 4897     3223          Abarrotes    Lacteos y Refrigerados
## 4898     3224          Abarrotes    Lacteos y Refrigerados
## 4899     3224           Farmacia      Material de Curación
## 4900     3224          Abarrotes                   Bebidas
## 4901     3226          Abarrotes            Pan y Tortilla
## 4902     3228          Abarrotes                   Bebidas
## 4903     3229          Abarrotes    Lacteos y Refrigerados
## 4904     3229          Abarrotes                  Cigarros
## 4905     3230          Abarrotes                   Bebidas
## 4906     3231          Abarrotes        Limpieza del Hogar
## 4907     3232          Abarrotes                  Especias
## 4908     3233          Abarrotes                   Bebidas
## 4909     3233          Abarrotes                   Bebidas
## 4910     3234          Abarrotes                   Bebidas
## 4911     3235          Abarrotes                   Bebidas
## 4912     3235          Abarrotes    Lacteos y Refrigerados
## 4913     3235          Abarrotes                   Bebidas
## 4914     3235          Abarrotes                   Bebidas
## 4915     3235          Abarrotes          Cuidado Personal
## 4916     3235          Abarrotes          Cuidado Personal
## 4917     3235          Abarrotes         Granos y Semillas
## 4918     3236          Abarrotes        Limpieza del Hogar
## 4919     3236          Abarrotes                   Bebidas
## 4920     3236          Abarrotes        Limpieza del Hogar
## 4921     3236          Abarrotes                   Bebidas
## 4922     3237          Abarrotes        Limpieza del Hogar
## 4923     3237          Abarrotes    Lacteos y Refrigerados
## 4924     3238          Abarrotes                  Galletas
## 4925     3238          Abarrotes    Lacteos y Refrigerados
## 4926     3239          Abarrotes    Lacteos y Refrigerados
## 4927     3239          Abarrotes                   Bebidas
## 4928     3239          Abarrotes                   Bebidas
## 4929     3240          Abarrotes                   Bebidas
## 4930     3241          Abarrotes                   Bebidas
## 4931     3242          Abarrotes        Limpieza del Hogar
## 4932     3243          Abarrotes            Pan y Tortilla
## 4933     3245 Bebes e Infantiles                Alimentos 
## 4934     3245 Bebes e Infantiles                Alimentos 
## 4935     3245          Abarrotes          Cuidado Personal
## 4936     3245          Abarrotes    Lacteos y Refrigerados
## 4937     3246          Abarrotes    Lacteos y Refrigerados
## 4938     3247          Abarrotes                  Cigarros
## 4939     3247          Abarrotes            Pan y Tortilla
## 4940     3249          Abarrotes                  Dulcería
## 4941     3249          Abarrotes    Lacteos y Refrigerados
## 4942     3251          Abarrotes                   Bebidas
## 4943     3251          Abarrotes                   Bebidas
## 4944     3253          Abarrotes                   Botanas
## 4945     3253          Abarrotes                   Bebidas
## 4946     3255          Abarrotes            Pan y Tortilla
## 4947     3255          Abarrotes                   Bebidas
## 4948     3257          Abarrotes                   Botanas
## 4949     3257          Abarrotes                   Cerveza
## 4950     3258          Abarrotes                   Bebidas
## 4951     3259          Abarrotes                   Bebidas
## 4952     3259          Abarrotes                  Cigarros
## 4953     3259          Abarrotes                   Bebidas
## 4954     3262          Abarrotes                   Bebidas
## 4955     3263          Abarrotes                  Aderezos
## 4956     3263          Abarrotes            Pan y Tortilla
## 4957     3263          Abarrotes                   Bebidas
## 4958     3264          Abarrotes          Cuidado Personal
## 4959     3266          Abarrotes                   Bebidas
## 4960     3268          Abarrotes                   Botanas
## 4961     3268          Abarrotes   Alimentos para Mascotas
## 4962     3268          Abarrotes            Pan y Tortilla
## 4963     3268          Abarrotes            Pan y Tortilla
## 4964     3268          Abarrotes                   Bebidas
## 4965     3269          Abarrotes                   Bebidas
## 4966     3269          Abarrotes    Lacteos y Refrigerados
## 4967     3269          Abarrotes                   Bebidas
## 4968     3271          Abarrotes                   Botanas
## 4969     3271          Abarrotes        Limpieza del Hogar
## 4970     3271          Abarrotes    Lacteos y Refrigerados
## 4971     3271          Abarrotes                  Cigarros
## 4972     3271          Abarrotes        Limpieza del Hogar
## 4973     3271          Abarrotes            Sopas y Pastas
## 4974     3273          Abarrotes                  Galletas
## 4975     3273          Abarrotes                   Bebidas
## 4976     3273          Abarrotes                   Bebidas
## 4977     3278          Abarrotes                   Botanas
## 4978     3278          Abarrotes    Lacteos y Refrigerados
## 4979     3279          Abarrotes                   Bebidas
## 4980     3279          Abarrotes                  Cereales
## 4981     3279 Bebes e Infantiles                Alimentos 
## 4982     3279          Abarrotes                  Dulcería
## 4983     3280          Abarrotes                   Botanas
## 4984     3280          Abarrotes                   Botanas
## 4985     3280          Abarrotes                   Bebidas
## 4986     3281          Abarrotes                   Bebidas
## 4987     3282          Abarrotes                   Bebidas
## 4988     3282          Abarrotes             Azúcar y Miel
## 4989     3283          Abarrotes        Limpieza del Hogar
## 4990     3283          Abarrotes                   Botanas
## 4991     3283          Abarrotes                   Bebidas
## 4992     3285          Abarrotes    Lacteos y Refrigerados
## 4993     3285          Abarrotes                  Cigarros
## 4994     3286          Abarrotes    Lacteos y Refrigerados
## 4995     3286          Abarrotes                   Bebidas
## 4996     3286          Abarrotes    Lacteos y Refrigerados
## 4997     3286          Abarrotes                   Bebidas
## 4998     3288          Abarrotes                   Bebidas
## 4999     3289          Abarrotes                   Bebidas
##                            NombreCategoria     Estado Mts.2 Tipo.ubicación
## 1                                    Leche Nuevo León    60        Esquina
## 2                                   Yogurt Nuevo León    60        Esquina
## 3                    Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4                Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 5                               Lavandería Nuevo León    60        Esquina
## 6                     Limpiadores Líquidos Nuevo León    60        Esquina
## 7                     Postres Refrigerados Nuevo León    60        Esquina
## 8                               Lavandería Nuevo León    60        Esquina
## 9                         Higiene Femenina Nuevo León    60        Esquina
## 10                        Jugos y Néctares Nuevo León    60        Esquina
## 11               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 12                       Aguas Saborizadas Nuevo León    60        Esquina
## 13               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 14                                Sandwich Nuevo León    60        Esquina
## 15                                   Leche Nuevo León    60        Esquina
## 16                              Malvavisco Nuevo León    60        Esquina
## 17                                   Leche Nuevo León    60        Esquina
## 18                              Lavandería Nuevo León    60        Esquina
## 19                                   Leche Nuevo León    60        Esquina
## 20                              Lavandería Nuevo León    60        Esquina
## 21                                  Tocino Nuevo León    60        Esquina
## 22                                   Leche Nuevo León    60        Esquina
## 23                        Jugos y Néctares Nuevo León    60        Esquina
## 24                   Refrescos Retornables Nuevo León    60        Esquina
## 25                             Pastelillos Nuevo León    60        Esquina
## 26               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 27                        Jugos y Néctares Nuevo León    60        Esquina
## 28               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 29                                  Quesos Nuevo León    60        Esquina
## 30                           Jamón de Pavo Nuevo León    60        Esquina
## 31               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 32                                   Leche Nuevo León    60        Esquina
## 33                                Rellenas Nuevo León    60        Esquina
## 34                   Afeitado y Depilación Nuevo León    60        Esquina
## 35               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 36                                   Leche Nuevo León    60        Esquina
## 37               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 38   Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 39                   Refrescos Retornables Nuevo León    60        Esquina
## 40                   Refrescos Retornables Nuevo León    60        Esquina
## 41                     Pan de Barra Blanco Nuevo León    60        Esquina
## 42                                Tostadas Nuevo León    60        Esquina
## 43               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 44                     Blanqueador de Ropa Nuevo León    60        Esquina
## 45                   Refrescos Retornables Nuevo León    60        Esquina
## 46                                  Yogurt Nuevo León    60        Esquina
## 47               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 48                     Cuidado del Cabello Nuevo León    60        Esquina
## 49                   Refrescos Retornables Nuevo León    60        Esquina
## 50                       Aguas Saborizadas Nuevo León    60        Esquina
## 51               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 52                            Papas Fritas Nuevo León    60        Esquina
## 53                            Papas Fritas Nuevo León    60        Esquina
## 54               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 55                                   Leche Nuevo León    60        Esquina
## 56               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 57                   Refrescos Retornables Nuevo León    60        Esquina
## 58                                  Quesos Nuevo León    60        Esquina
## 59                                Frituras Nuevo León    60        Esquina
## 60               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 61               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 62               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 63                                   Leche Nuevo León    60        Esquina
## 64               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 65               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 66               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 67                   Refrescos Retornables Nuevo León    60        Esquina
## 68                              Lavandería Nuevo León    60        Esquina
## 69                        Jugos y Néctares Nuevo León    60        Esquina
## 70                     Blanqueador de Ropa Nuevo León    60        Esquina
## 71               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 72                                Frituras Nuevo León    60        Esquina
## 73                              Chocolates Nuevo León    60        Esquina
## 74               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 75                   Concentrados en Polvo Nuevo León    60        Esquina
## 76                            Papas Fritas Nuevo León    60        Esquina
## 77                         Cremas de Nieve Nuevo León    60        Esquina
## 78                                   Aguas Nuevo León    60        Esquina
## 79                                   Arroz Nuevo León    60        Esquina
## 80                   Refrescos Retornables Nuevo León    60        Esquina
## 81               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 82                            Papas Fritas Nuevo León    60        Esquina
## 83               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 84                                Frituras Nuevo León    60        Esquina
## 85               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 86                 Productos sin Categoria Nuevo León    60        Esquina
## 87                         Gomas de Mazcar Nuevo León    60        Esquina
## 88               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 89                   Refrescos Retornables Nuevo León    60        Esquina
## 90                                   Leche Nuevo León    60        Esquina
## 91                                   Aguas Nuevo León    60        Esquina
## 92                                Frituras Nuevo León    60        Esquina
## 93               Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 94                   Refrescos Retornables Nuevo León    60        Esquina
## 95                     Antojitos Mexicanos Nuevo León    60        Esquina
## 96                                Frituras Nuevo León    60        Esquina
## 97                                Sandwich Nuevo León    60        Esquina
## 98                                   Aguas Nuevo León    60        Esquina
## 99                         Gomas de Mazcar Nuevo León    60        Esquina
## 100                      Aguas Saborizadas Nuevo León    60        Esquina
## 101                           Papas Fritas Nuevo León    60        Esquina
## 102                  Refrescos Retornables Nuevo León    60        Esquina
## 103                               Frituras Nuevo León    60        Esquina
## 104              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 105              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 106              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 107              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 108                               Frituras Nuevo León    60        Esquina
## 109                             Lavandería Nuevo León    60        Esquina
## 110             Energizantes e Hidratantes Nuevo León    60        Esquina
## 111                  Refrescos Retornables Nuevo León    60        Esquina
## 112                    Cuidado del Cabello Nuevo León    60        Esquina
## 113                    Limpieza de Calzado Nuevo León    60        Esquina
## 114              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 115              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 116                                Paletas Nuevo León    60        Esquina
## 117                                Paletas Nuevo León    60        Esquina
## 118                        Gomas de Mazcar Nuevo León    60        Esquina
## 119                    Pan de Barra Blanco Nuevo León    60        Esquina
## 120                              Cajetilla Nuevo León    60        Esquina
## 121                      Aguas Saborizadas Nuevo León    60        Esquina
## 122              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 123                                Paletas Nuevo León    60        Esquina
## 124                               Tostadas Nuevo León    60        Esquina
## 125                Productos sin Categoria Nuevo León    60        Esquina
## 126  Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 127  Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 128                                  Aguas Nuevo León    60        Esquina
## 129                  Refrescos Retornables Nuevo León    60        Esquina
## 130                Productos sin Categoria Nuevo León    60        Esquina
## 131                       Leche Saborizada Nuevo León    60        Esquina
## 132                  Concentrados en Polvo Nuevo León    60        Esquina
## 133              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 134                                Surtido Nuevo León    60        Esquina
## 135                                 Quesos Nuevo León    60        Esquina
## 136              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 137                               Frituras Nuevo León    60        Esquina
## 138  Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 139                  Refrescos Retornables Nuevo León    60        Esquina
## 140                                 Catsup Nuevo León    60        Esquina
## 141              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 142                Productos sin Categoria Nuevo León    60        Esquina
## 143              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 144              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 145                  Refrescos Retornables Nuevo León    60        Esquina
## 146                        Platos y Vasos  Nuevo León    60        Esquina
## 147                   Salsa para Spaguetti Nuevo León    60        Esquina
## 148                           Papas Fritas Nuevo León    60        Esquina
## 149                               Rellenas Nuevo León    60        Esquina
## 150              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 151                             Lavandería Nuevo León    60        Esquina
## 152                                  Leche Nuevo León    60        Esquina
## 153                               Frituras Nuevo León    60        Esquina
## 154                               Frituras Nuevo León    60        Esquina
## 155              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 156                             Lavandería Nuevo León    60        Esquina
## 157                  Refrescos Retornables Nuevo León    60        Esquina
## 158                               Sandwich Nuevo León    60        Esquina
## 159              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 160              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 161                           Papas Fritas Nuevo León    60        Esquina
## 162              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 163              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 164                  Refrescos Retornables Nuevo León    60        Esquina
## 165                               Sandwich Nuevo León    60        Esquina
## 166             Energizantes e Hidratantes Nuevo León    60        Esquina
## 167              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 168                                  Leche Nuevo León    60        Esquina
## 169              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 170                             Lavandería Nuevo León    60        Esquina
## 171                                Vinagre Nuevo León    60        Esquina
## 172                    Pan de Barra Blanco Nuevo León    60        Esquina
## 173              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 174                                 Yogurt Nuevo León    60        Esquina
## 175                           Papas Fritas Nuevo León    60        Esquina
## 176                  Refrescos Retornables Nuevo León    60        Esquina
## 177              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 178                               Frituras Nuevo León    60        Esquina
## 179                               Frituras Nuevo León    60        Esquina
## 180                                Consome Nuevo León    60        Esquina
## 181                            Lavatrastes Nuevo León    60        Esquina
## 182                               Frituras Nuevo León    60        Esquina
## 183                             Lavandería Nuevo León    60        Esquina
## 184                      Aguas Saborizadas Nuevo León    60        Esquina
## 185              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 186                              Cajetilla Nuevo León    60        Esquina
## 187                               Frituras Nuevo León    60        Esquina
## 188                       Leche Saborizada Nuevo León    60        Esquina
## 189                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 190                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 191                     Barras Energéticas Nuevo León    60        Esquina
## 192                                Surtido Nuevo León    60        Esquina
## 193                               Frituras Nuevo León    60        Esquina
## 194              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 195                           Papas Fritas Nuevo León    60        Esquina
## 196              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 197                  Concentrados en Polvo Nuevo León    60        Esquina
## 198              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 199                        Papel Higiénico Nuevo León    60        Esquina
## 200                             Cacahuates Nuevo León    60        Esquina
## 201                               Sandwich Nuevo León    60        Esquina
## 202                           Papas Fritas Nuevo León    60        Esquina
## 203                           Papas Fritas Nuevo León    60        Esquina
## 204                               Frituras Nuevo León    60        Esquina
## 205              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 206                        Platos y Vasos  Nuevo León    60        Esquina
## 207                        Platos y Vasos  Nuevo León    60        Esquina
## 208                    Pan de Barra Blanco Nuevo León    60        Esquina
## 209                                 Quesos Nuevo León    60        Esquina
## 210                  Refrescos Retornables Nuevo León    60        Esquina
## 211                   Postres Refrigerados Nuevo León    60        Esquina
## 212                               Frituras Nuevo León    60        Esquina
## 213                       Leche Saborizada Nuevo León    60        Esquina
## 214                   Postres Refrigerados Nuevo León    60        Esquina
## 215                           Papas Fritas Nuevo León    60        Esquina
## 216                               Frituras Nuevo León    60        Esquina
## 217                    Chicharrón de Cerdo Nuevo León    60        Esquina
## 218              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 219                               Frituras Nuevo León    60        Esquina
## 220              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 221                               Frituras Nuevo León    60        Esquina
## 222              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 223              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 224              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 225                       Jugos y Néctares Nuevo León    60        Esquina
## 226                           Dulce Macizo Nuevo León    60        Esquina
## 227              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 228                              Cajetilla Nuevo León    60        Esquina
## 229              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 230              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 231                  Refrescos Retornables Nuevo León    60        Esquina
## 232              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 233                            Pastelillos Nuevo León    60        Esquina
## 234              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 235                          Sal Combinada Nuevo León    60        Esquina
## 236                   Chicharrón de Harina Nuevo León    60        Esquina
## 237                           Papas Fritas Nuevo León    60        Esquina
## 238                                Surtido Nuevo León    60        Esquina
## 239              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 240                             Lavandería Nuevo León    60        Esquina
## 241                             Lavandería Nuevo León    60        Esquina
## 242                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 243                    Blanqueador de Ropa Nuevo León    60        Esquina
## 244                               Frituras Nuevo León    60        Esquina
## 245                                 Yogurt Nuevo León    60        Esquina
## 246              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 247                      Aguas Saborizadas Nuevo León    60        Esquina
## 248              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 249                              Cajetilla Nuevo León    60        Esquina
## 250                      Aguas Saborizadas Nuevo León    60        Esquina
## 251              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 252                    Cuidado del Cabello Nuevo León    60        Esquina
## 253                  Refrescos Retornables Nuevo León    60        Esquina
## 254                                  Leche Nuevo León    60        Esquina
## 255                       Leche Saborizada Nuevo León    60        Esquina
## 256                Productos sin Categoria Nuevo León    60        Esquina
## 257                               Frituras Nuevo León    60        Esquina
## 258                    Blanqueador de Ropa Nuevo León    60        Esquina
## 259                  Refrescos Retornables Nuevo León    60        Esquina
## 260              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 261                              Cajetilla Nuevo León    60        Esquina
## 262                             Lavandería Nuevo León    60        Esquina
## 263                           Papas Fritas Nuevo León    60        Esquina
## 264                    Blanqueador de Ropa Nuevo León    60        Esquina
## 265                    Chicharrón de Cerdo Nuevo León    60        Esquina
## 266                             Lavandería Nuevo León    60        Esquina
## 267                      Aguas Saborizadas Nuevo León    60        Esquina
## 268                               Frituras Nuevo León    60        Esquina
## 269                  Refrescos Retornables Nuevo León    60        Esquina
## 270                               Frituras Nuevo León    60        Esquina
## 271                                Paletas Nuevo León    60        Esquina
## 272                  Refrescos Retornables Nuevo León    60        Esquina
## 273                             Chocolates Nuevo León    60        Esquina
## 274             Energizantes e Hidratantes Nuevo León    60        Esquina
## 275                 Insecticidas y Venenos Nuevo León    60        Esquina
## 276                       Jugos y Néctares Nuevo León    60        Esquina
## 277                           Papas Fritas Nuevo León    60        Esquina
## 278                                 Yogurt Nuevo León    60        Esquina
## 279                                 Yogurt Nuevo León    60        Esquina
## 280                            Pastelillos Nuevo León    60        Esquina
## 281                       Leche Saborizada Nuevo León    60        Esquina
## 282                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 283                    Blanqueador de Ropa Nuevo León    60        Esquina
## 284                           Papas Fritas Nuevo León    60        Esquina
## 285                              Cajetilla Nuevo León    60        Esquina
## 286                     Barras Energéticas Nuevo León    60        Esquina
## 287              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 288             Energizantes e Hidratantes Nuevo León    60        Esquina
## 289                      Aguas Saborizadas Nuevo León    60        Esquina
## 290                Productos sin Categoria Nuevo León    60        Esquina
## 291              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 292                                  Aguas Nuevo León    60        Esquina
## 293                               Frituras Nuevo León    60        Esquina
## 294              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 295                               Frituras Nuevo León    60        Esquina
## 296                               Frituras Nuevo León    60        Esquina
## 297              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 298                Productos sin Categoria Nuevo León    60        Esquina
## 299                    Blanqueador de Ropa Nuevo León    60        Esquina
## 300                            Lavatrastes Nuevo León    60        Esquina
## 301                      Aguas Saborizadas Nuevo León    60        Esquina
## 302                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 303                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 304                               Frituras Nuevo León    60        Esquina
## 305                   Limpiadores Líquidos Nuevo León    60        Esquina
## 306                              Cajetilla Nuevo León    60        Esquina
## 307              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 308              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 309                              Cajetilla Nuevo León    60        Esquina
## 310              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 311                  Refrescos Retornables Nuevo León    60        Esquina
## 312              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 313                               Frituras Nuevo León    60        Esquina
## 314                                  Leche Nuevo León    60        Esquina
## 315              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 316                               Frituras Nuevo León    60        Esquina
## 317                               Frituras Nuevo León    60        Esquina
## 318              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 319                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 320              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 321                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 322                            Pastelillos Nuevo León    60        Esquina
## 323                             Lavandería Nuevo León    60        Esquina
## 324                            Pastelillos Nuevo León    60        Esquina
## 325                  Refrescos Retornables Nuevo León    60        Esquina
## 326                  Refrescos Retornables Nuevo León    60        Esquina
## 327              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 328                              Cajetilla Nuevo León    60        Esquina
## 329                               Frituras Nuevo León    60        Esquina
## 330                               Frituras Nuevo León    60        Esquina
## 331                           Papas Fritas Nuevo León    60        Esquina
## 332                                  Leche Nuevo León    60        Esquina
## 333             Energizantes e Hidratantes Nuevo León    60        Esquina
## 334              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 335              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 336              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 337              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 338                                 Yogurt Nuevo León    60        Esquina
## 339                           Papas Fritas Nuevo León    60        Esquina
## 340                               Frituras Nuevo León    60        Esquina
## 341                                 Yogurt Nuevo León    60        Esquina
## 342                           Papas Fritas Nuevo León    60        Esquina
## 343                      Refrescos en Lata Nuevo León    60        Esquina
## 344                           Papas Fritas Nuevo León    60        Esquina
## 345                             Malvavisco Nuevo León    60        Esquina
## 346                            Pastelillos Nuevo León    60        Esquina
## 347              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 348                               Frituras Nuevo León    60        Esquina
## 349                  Refrescos Retornables Nuevo León    60        Esquina
## 350                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 351                       Jugos y Néctares Nuevo León    60        Esquina
## 352                       Jugos y Néctares Nuevo León    60        Esquina
## 353                  Refrescos Retornables Nuevo León    60        Esquina
## 354              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 355                             Lavandería Nuevo León    60        Esquina
## 356                               Frituras Nuevo León    60        Esquina
## 357              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 358                   Limpiadores Líquidos Nuevo León    60        Esquina
## 359                               Semillas Nuevo León    60        Esquina
## 360                    Chicharrón de Cerdo Nuevo León    60        Esquina
## 361                  Refrescos Retornables Nuevo León    60        Esquina
## 362              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 363                  Refrescos Retornables Nuevo León    60        Esquina
## 364                  Refrescos Retornables Nuevo León    60        Esquina
## 365              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 366              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 367                            Lavatrastes Nuevo León    60        Esquina
## 368                            Frijol Bayo Nuevo León    60        Esquina
## 369                    Blanqueador de Ropa Nuevo León    60        Esquina
## 370                   Limpiadores Líquidos Nuevo León    60        Esquina
## 371              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 372                Productos sin Categoria Nuevo León    60        Esquina
## 373                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 374              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 375                  Refrescos Retornables Nuevo León    60        Esquina
## 376                       Jugos y Néctares Nuevo León    60        Esquina
## 377              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 378              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 379                  Refrescos Retornables Nuevo León    60        Esquina
## 380                                  Leche Nuevo León    60        Esquina
## 381                Productos sin Categoria Nuevo León    60        Esquina
## 382                            Lavatrastes Nuevo León    60        Esquina
## 383                       Jugos y Néctares Nuevo León    60        Esquina
## 384                       Jugos y Néctares Nuevo León    60        Esquina
## 385              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 386                    Pan de Barra Blanco Nuevo León    60        Esquina
## 387                       Leche Saborizada Nuevo León    60        Esquina
## 388                           Papas Fritas Nuevo León    60        Esquina
## 389                               Frituras Nuevo León    60        Esquina
## 390                      Refrescos en Lata Nuevo León    60        Esquina
## 391              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 392              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 393              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 394              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 395              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 396              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 397              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 398                               Frituras Nuevo León    60        Esquina
## 399                   Limpiadores Líquidos Nuevo León    60        Esquina
## 400                           Papas Fritas Nuevo León    60        Esquina
## 401                             Lavandería Nuevo León    60        Esquina
## 402              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 403              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 404                                  Leche Nuevo León    60        Esquina
## 405                               Frituras Nuevo León    60        Esquina
## 406                       Jugos y Néctares Nuevo León    60        Esquina
## 407                       Higiene Femenina Nuevo León    60        Esquina
## 408                               Frituras Nuevo León    60        Esquina
## 409                               Frituras Nuevo León    60        Esquina
## 410                               Frituras Nuevo León    60        Esquina
## 411                               Frituras Nuevo León    60        Esquina
## 412              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 413                               Frituras Nuevo León    60        Esquina
## 414                      Aguas Saborizadas Nuevo León    60        Esquina
## 415                  Concentrados en Polvo Nuevo León    60        Esquina
## 416                       Jugos y Néctares Nuevo León    60        Esquina
## 417                              Cajetilla Nuevo León    60        Esquina
## 418                        Platos y Vasos  Nuevo León    60        Esquina
## 419                                 Atoles Nuevo León    60        Esquina
## 420                           Papas Fritas Nuevo León    60        Esquina
## 421                Productos sin Categoria Nuevo León    60        Esquina
## 422                Productos sin Categoria Nuevo León    60        Esquina
## 423                    Blanqueador de Ropa Nuevo León    60        Esquina
## 424                    Pan de Barra Blanco Nuevo León    60        Esquina
## 425                  Refrescos Retornables Nuevo León    60        Esquina
## 426                  Concentrados en Polvo Nuevo León    60        Esquina
## 427                  Concentrados en Polvo Nuevo León    60        Esquina
## 428                  Refrescos Retornables Nuevo León    60        Esquina
## 429                           Papas Fritas Nuevo León    60        Esquina
## 430                              Mayonesa  Nuevo León    60        Esquina
## 431              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 432              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 433                  Refrescos Retornables Nuevo León    60        Esquina
## 434              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 435                  Refrescos Retornables Nuevo León    60        Esquina
## 436                  Refrescos Retornables Nuevo León    60        Esquina
## 437                  Concentrados en Polvo Nuevo León    60        Esquina
## 438             Energizantes e Hidratantes Nuevo León    60        Esquina
## 439                               Frituras Nuevo León    60        Esquina
## 440                   Limpiadores Líquidos Nuevo León    60        Esquina
## 441  Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 442              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 443  Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 444              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 445                       Jugos y Néctares Nuevo León    60        Esquina
## 446              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 447                               Frituras Nuevo León    60        Esquina
## 448              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 449                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 450                               Frituras Nuevo León    60        Esquina
## 451                  Afeitado y Depilación Nuevo León    60        Esquina
## 452              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 453              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 454              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 455              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 456                                  Arroz Nuevo León    60        Esquina
## 457                                 Atoles Nuevo León    60        Esquina
## 458                             Chocolates Nuevo León    60        Esquina
## 459             Energizantes e Hidratantes Nuevo León    60        Esquina
## 460                             Lavandería Nuevo León    60        Esquina
## 461                            Pastelillos Nuevo León    60        Esquina
## 462                             Lavandería Nuevo León    60        Esquina
## 463              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 464                       Jugos y Néctares Nuevo León    60        Esquina
## 465                               Rellenas Nuevo León    60        Esquina
## 466              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 467                       Jugos y Néctares Nuevo León    60        Esquina
## 468              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 469              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 470                  Concentrados en Polvo Nuevo León    60        Esquina
## 471              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 472                  Concentrados en Polvo Nuevo León    60        Esquina
## 473                            Pastelillos Nuevo León    60        Esquina
## 474              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 475                       Jugos y Néctares Nuevo León    60        Esquina
## 476                Productos sin Categoria Nuevo León    60        Esquina
## 477                           Papas Fritas Nuevo León    60        Esquina
## 478                  Refrescos Retornables Nuevo León    60        Esquina
## 479              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 480              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 481                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 482                               Frituras Nuevo León    60        Esquina
## 483              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 484              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 485                                   Maíz Nuevo León    60        Esquina
## 486                Productos sin Categoria Nuevo León    60        Esquina
## 487                                Saladas Nuevo León    60        Esquina
## 488              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 489                          Tradicionales Nuevo León    60        Esquina
## 490                                Saladas Nuevo León    60        Esquina
## 491                             Lavandería Nuevo León    60        Esquina
## 492                   Salsa para Spaguetti Nuevo León    60        Esquina
## 493                                Saladas Nuevo León    60        Esquina
## 494                               Frituras Nuevo León    60        Esquina
## 495                           Dulce Macizo Nuevo León    60        Esquina
## 496              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 497                   Salsa para Spaguetti Nuevo León    60        Esquina
## 498              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 499              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 500                    Blanqueador de Ropa Nuevo León    60        Esquina
## 501                   Limpiadores Líquidos Nuevo León    60        Esquina
## 502              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 503              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 504              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 505              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 506              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 507                  Refrescos Retornables Nuevo León    60        Esquina
## 508                                   Lata Nuevo León    60        Esquina
## 509                              Cajetilla Nuevo León    60        Esquina
## 510              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 511              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 512                             Chocolates Nuevo León    60        Esquina
## 513                   Limpiadores Líquidos Nuevo León    60        Esquina
## 514                            Lavatrastes Nuevo León    60        Esquina
## 515              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 516              Aromatizantes de Ambiente Nuevo León    60        Esquina
## 517                                 Quesos Nuevo León    60        Esquina
## 518                    Blanqueador de Ropa Nuevo León    60        Esquina
## 519                   Limpiadores Líquidos Nuevo León    60        Esquina
## 520              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 521                           Papas Fritas Nuevo León    60        Esquina
## 522                    Pan de Barra Blanco Nuevo León    60        Esquina
## 523              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 524              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 525                                 Quesos Nuevo León    60        Esquina
## 526              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 527              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 528                               Frituras Nuevo León    60        Esquina
## 529                               Frituras Nuevo León    60        Esquina
## 530              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 531                    Cuidado del Cabello Nuevo León    60        Esquina
## 532                  Concentrados en Polvo Nuevo León    60        Esquina
## 533                              Cajetilla Nuevo León    60        Esquina
## 534              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 535              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 536              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 537              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 538              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 539                       Jugos y Néctares Nuevo León    60        Esquina
## 540              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 541              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 542             Energizantes e Hidratantes Nuevo León    60        Esquina
## 543              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 544              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 545              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 546                  Concentrados en Polvo Nuevo León    60        Esquina
## 547              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 548                               Frituras Nuevo León    60        Esquina
## 549              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 550                  Refrescos Retornables Nuevo León    60        Esquina
## 551                  Refrescos Retornables Nuevo León    60        Esquina
## 552                  Refrescos Retornables Nuevo León    60        Esquina
## 553                              Cajetilla Nuevo León    60        Esquina
## 554                                   Atún Nuevo León    60        Esquina
## 555              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 556                                 Nachos Nuevo León    60        Esquina
## 557                              Chocolate Nuevo León    60        Esquina
## 558                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 559                               Frituras Nuevo León    60        Esquina
## 560                               Frituras Nuevo León    60        Esquina
## 561                                   Lata Nuevo León    60        Esquina
## 562              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 563                       Chiles Envasados Nuevo León    60        Esquina
## 564                  Refrescos Retornables Nuevo León    60        Esquina
## 565                   Postres Refrigerados Nuevo León    60        Esquina
## 566              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 567                       Leche Saborizada Nuevo León    60        Esquina
## 568                                Surtido Nuevo León    60        Esquina
## 569             Energizantes e Hidratantes Nuevo León    60        Esquina
## 570                                Mazapán Nuevo León    60        Esquina
## 571                           Dulce Macizo Nuevo León    60        Esquina
## 572                               Lentejas Nuevo León    60        Esquina
## 573                      Aguas Saborizadas Nuevo León    60        Esquina
## 574                                 Quesos Nuevo León    60        Esquina
## 575                                 Cremas Nuevo León    60        Esquina
## 576                       Jugos y Néctares Nuevo León    60        Esquina
## 577              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 578                  Refrescos Retornables Nuevo León    60        Esquina
## 579                             Chocolates Nuevo León    60        Esquina
## 580              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 581                                  Leche Nuevo León    60        Esquina
## 582                Productos sin Categoria Nuevo León    60        Esquina
## 583                   Chicharrón de Harina Nuevo León    60        Esquina
## 584                              Palomitas Nuevo León    60        Esquina
## 585                               Frituras Nuevo León    60        Esquina
## 586  Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 587                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 588                  Refrescos Retornables Nuevo León    60        Esquina
## 589                  Afeitado y Depilación Nuevo León    60        Esquina
## 590                  Afeitado y Depilación Nuevo León    60        Esquina
## 591                  Refrescos Retornables Nuevo León    60        Esquina
## 592                      Aguas Saborizadas Nuevo León    60        Esquina
## 593                               Frituras Nuevo León    60        Esquina
## 594                               Frituras Nuevo León    60        Esquina
## 595              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 596                                Saladas Nuevo León    60        Esquina
## 597                                  Leche Nuevo León    60        Esquina
## 598              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 599                  Refrescos Retornables Nuevo León    60        Esquina
## 600                                  Aguas Nuevo León    60        Esquina
## 601                  Refrescos Retornables Nuevo León    60        Esquina
## 602                                 Cremas Nuevo León    60        Esquina
## 603              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 604                        Platos y Vasos  Nuevo León    60        Esquina
## 605                                   Café Nuevo León    60        Esquina
## 606                     Barras Energéticas Nuevo León    60        Esquina
## 607                               Frituras Nuevo León    60        Esquina
## 608                                  Leche Nuevo León    60        Esquina
## 609                             Lavandería Nuevo León    60        Esquina
## 610                        Papel Higiénico Nuevo León    60        Esquina
## 611                           Pasta Dental Nuevo León    60        Esquina
## 612                           Pasta Dental Nuevo León    60        Esquina
## 613                          Desodorantes  Nuevo León    60        Esquina
## 614                           Pasta Dental Nuevo León    60        Esquina
## 615                               Tostadas Nuevo León    60        Esquina
## 616                             Cacahuates Nuevo León    60        Esquina
## 617                             Cacahuates Nuevo León    60        Esquina
## 618              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 619                       Chiles Envasados Nuevo León    60        Esquina
## 620              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 621                                Saladas Nuevo León    60        Esquina
## 622                  Refrescos Retornables Nuevo León    60        Esquina
## 623                            Mantequilla Nuevo León    60        Esquina
## 624              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 625                  Concentrados en Polvo Nuevo León    60        Esquina
## 626                  Concentrados en Polvo Nuevo León    60        Esquina
## 627                               Tostadas Nuevo León    60        Esquina
## 628              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 629                              Cajetilla Nuevo León    60        Esquina
## 630                             Tropicales Nuevo León    60        Esquina
## 631                                Surtido Nuevo León    60        Esquina
## 632                           Papas Fritas Nuevo León    60        Esquina
## 633                  Pan de Barra Integral Nuevo León    60        Esquina
## 634                               Frituras Nuevo León    60        Esquina
## 635                                   Maíz Nuevo León    60        Esquina
## 636              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 637                   Salsa para Spaguetti Nuevo León    60        Esquina
## 638                              Cajetilla Nuevo León    60        Esquina
## 639                           Papas Fritas Nuevo León    60        Esquina
## 640              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 641                           Papas Fritas Nuevo León    60        Esquina
## 642              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 643              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 644                       Jugos y Néctares Nuevo León    60        Esquina
## 645              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 646              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 647                        Platos y Vasos  Nuevo León    60        Esquina
## 648             Energizantes e Hidratantes Nuevo León    60        Esquina
## 649                           Papas Fritas Nuevo León    60        Esquina
## 650              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 651                  Refrescos Retornables Nuevo León    60        Esquina
## 652              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 653              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 654              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 655          Fideos, Spaguetti, Tallarines Nuevo León    60        Esquina
## 656                    Pastas de Figuritas Nuevo León    60        Esquina
## 657          Fideos, Spaguetti, Tallarines Nuevo León    60        Esquina
## 658                              Cajetilla Nuevo León    60        Esquina
## 659                                   Maíz Nuevo León    60        Esquina
## 660                  Refrescos Retornables Nuevo León    60        Esquina
## 661                  Refrescos Retornables Nuevo León    60        Esquina
## 662                       Jugos y Néctares Nuevo León    60        Esquina
## 663                  Refrescos Retornables Nuevo León    60        Esquina
## 664                  Refrescos Retornables Nuevo León    60        Esquina
## 665                  Refrescos Retornables Nuevo León    60        Esquina
## 666                       Leche Saborizada Nuevo León    60        Esquina
## 667                          Salsa Picante Nuevo León    60        Esquina
## 668                            Pastelillos Nuevo León    60        Esquina
## 669              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 670              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 671              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 672                             Chile Seco Nuevo León    60        Esquina
## 673              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 674              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 675              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 676              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 677              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 678                              Cajetilla Nuevo León    60        Esquina
## 679                  Refrescos Retornables Nuevo León    60        Esquina
## 680                          Salsa Picante Nuevo León    60        Esquina
## 681                  Refrescos Retornables Nuevo León    60        Esquina
## 682              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 683                               Achiotes Nuevo León    60        Esquina
## 684       Tortillas de Harina e Integrales Nuevo León    60        Esquina
## 685                       Higiene Femenina Nuevo León    60        Esquina
## 686              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 687                  Refrescos Retornables Nuevo León    60        Esquina
## 688              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 689                Productos sin Categoria Nuevo León    60        Esquina
## 690              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 691                  Refrescos Retornables Nuevo León    60        Esquina
## 692                           Papas Fritas Nuevo León    60        Esquina
## 693              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 694                Productos sin Categoria Nuevo León    60        Esquina
## 695                  Afeitado y Depilación Nuevo León    60        Esquina
## 696                  Concentrados en Polvo Nuevo León    60        Esquina
## 697                       Jugos y Néctares Nuevo León    60        Esquina
## 698              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 699                       Jugos y Néctares Nuevo León    60        Esquina
## 700                               Frituras Nuevo León    60        Esquina
## 701                               Frituras Nuevo León    60        Esquina
## 702                      Aguas Saborizadas Nuevo León    60        Esquina
## 703                               Frituras Nuevo León    60        Esquina
## 704                              Cajetilla Nuevo León    60        Esquina
## 705                       Leche Saborizada Nuevo León    60        Esquina
## 706                   Postres Refrigerados Nuevo León    60        Esquina
## 707                                 Yogurt Nuevo León    60        Esquina
## 708                              Cajetilla Nuevo León    60        Esquina
## 709                                 Quesos Nuevo León    60        Esquina
## 710                              Cajetilla Nuevo León    60        Esquina
## 711                                Mazapán Nuevo León    60        Esquina
## 712                             Chocolates Nuevo León    60        Esquina
## 713                              Cajetilla Nuevo León    60        Esquina
## 714                              Cajetilla Nuevo León    60        Esquina
## 715                             Malvavisco Nuevo León    60        Esquina
## 716              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 717                 Pan Tostado y Crotones Nuevo León    60        Esquina
## 718                                  Leche Nuevo León    60        Esquina
## 719             Energizantes e Hidratantes Nuevo León    60        Esquina
## 720                       Jugos y Néctares Nuevo León    60        Esquina
## 721                               Frituras Nuevo León    60        Esquina
## 722                               Frituras Nuevo León    60        Esquina
## 723              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 724                Productos sin Categoria Nuevo León    60        Esquina
## 725                  Refrescos Retornables Nuevo León    60        Esquina
## 726                               Frituras Nuevo León    60        Esquina
## 727                Productos sin Categoria Nuevo León    60        Esquina
## 728                   Postres Refrigerados Nuevo León    60        Esquina
## 729              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 730                               Semillas Nuevo León    60        Esquina
## 731                           Papas Fritas Nuevo León    60        Esquina
## 732                             Chocolates Nuevo León    60        Esquina
## 733              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 734                            Pastelillos Nuevo León    60        Esquina
## 735              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 736                  Refrescos Retornables Nuevo León    60        Esquina
## 737                  Concentrados en Polvo Nuevo León    60        Esquina
## 738              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 739                                  Leche Nuevo León    60        Esquina
## 740                          Jamón de Pavo Nuevo León    60        Esquina
## 741                                Surtido Nuevo León    60        Esquina
## 742                           Papas Fritas Nuevo León    60        Esquina
## 743              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 744             Energizantes e Hidratantes Nuevo León    60        Esquina
## 745                  Refrescos Retornables Nuevo León    60        Esquina
## 746                       Jugos y Néctares Nuevo León    60        Esquina
## 747                           Papas Fritas Nuevo León    60        Esquina
## 748                           Papas Fritas Nuevo León    60        Esquina
## 749             Energizantes e Hidratantes Nuevo León    60        Esquina
## 750                              Cajetilla Nuevo León    60        Esquina
## 751                               Frituras Nuevo León    60        Esquina
## 752                  Refrescos Retornables Nuevo León    60        Esquina
## 753                         Leche en Polvo Nuevo León    60        Esquina
## 754                                  Arroz Nuevo León    60        Esquina
## 755             Energizantes e Hidratantes Nuevo León    60        Esquina
## 756                          Salsa Picante Nuevo León    60        Esquina
## 757                                  Leche Nuevo León    60        Esquina
## 758                  Refrescos Retornables Nuevo León    60        Esquina
## 759                              Cajetilla Nuevo León    60        Esquina
## 760                    Cuidado del Cabello Nuevo León    60        Esquina
## 761                        Papel Higiénico Nuevo León    60        Esquina
## 762             Energizantes e Hidratantes Nuevo León    60        Esquina
## 763              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 764                        Platos y Vasos  Nuevo León    60        Esquina
## 765                          Tradicionales Nuevo León    60        Esquina
## 766                               Frituras Nuevo León    60        Esquina
## 767                  Refrescos Retornables Nuevo León    60        Esquina
## 768                               Frituras Nuevo León    60        Esquina
## 769                  Afeitado y Depilación Nuevo León    60        Esquina
## 770                              Cajetilla Nuevo León    60        Esquina
## 771                                Surtido Nuevo León    60        Esquina
## 772                  Refrescos Retornables Nuevo León    60        Esquina
## 773                   Limpiadores Líquidos Nuevo León    60        Esquina
## 774                              Chocolate Nuevo León    60        Esquina
## 775                                Saladas Nuevo León    60        Esquina
## 776                                  Leche Nuevo León    60        Esquina
## 777              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 778                       Jugos y Néctares Nuevo León    60        Esquina
## 779              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 780                Productos sin Categoria Nuevo León    60        Esquina
## 781                                  Arroz Nuevo León    60        Esquina
## 782                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 783                                 Yogurt Nuevo León    60        Esquina
## 784                          Tradicionales Nuevo León    60        Esquina
## 785                Productos sin Categoria Nuevo León    60        Esquina
## 786                                  Leche Nuevo León    60        Esquina
## 787              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 788                                 Yogurt Nuevo León    60        Esquina
## 789                             Chocolates Nuevo León    60        Esquina
## 790                  Refrescos Retornables Nuevo León    60        Esquina
## 791                       Higiene Femenina Nuevo León    60        Esquina
## 792              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 793                                  Aguas Nuevo León    60        Esquina
## 794                                 Yogurt Nuevo León    60        Esquina
## 795                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 796                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 797              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 798                  Refrescos Retornables Nuevo León    60        Esquina
## 799                       Jugos y Néctares Nuevo León    60        Esquina
## 800                Productos sin Categoria Nuevo León    60        Esquina
## 801                  Refrescos Retornables Nuevo León    60        Esquina
## 802                             Chocolates Nuevo León    60        Esquina
## 803                Productos sin Categoria Nuevo León    60        Esquina
## 804              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 805                       Jugos y Néctares Nuevo León    60        Esquina
## 806                       Jugos y Néctares Nuevo León    60        Esquina
## 807              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 808                               Frituras Nuevo León    60        Esquina
## 809                              Chocolate Nuevo León    60        Esquina
## 810                       Jugos y Néctares Nuevo León    60        Esquina
## 811              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 812              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 813              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 814              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 815                  Pan de Barra Integral Nuevo León    60        Esquina
## 816                            Frijol Bayo Nuevo León    60        Esquina
## 817              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 818              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 819                                   Mole Nuevo León    60        Esquina
## 820                               Frituras Nuevo León    60        Esquina
## 821                               Frituras Nuevo León    60        Esquina
## 822                  Refrescos Retornables Nuevo León    60        Esquina
## 823                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 824              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 825                             Cacahuates Nuevo León    60        Esquina
## 826              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 827                               Semillas Nuevo León    60        Esquina
## 828                                  Leche Nuevo León    60        Esquina
## 829              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 830                  Concentrados en Polvo Nuevo León    60        Esquina
## 831                               Rellenas Nuevo León    60        Esquina
## 832                       Jugos y Néctares Nuevo León    60        Esquina
## 833              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 834                   Verduras y Vegetales Nuevo León    60        Esquina
## 835                          Avena y Fibra Nuevo León    60        Esquina
## 836              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 837                  Refrescos Retornables Nuevo León    60        Esquina
## 838                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 839                                  Leche Nuevo León    60        Esquina
## 840                    Cuidado del Cabello Nuevo León    60        Esquina
## 841                                  Leche Nuevo León    60        Esquina
## 842                            Pastelillos Nuevo León    60        Esquina
## 843                       Jugos y Néctares Nuevo León    60        Esquina
## 844              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 845                                  Aguas Nuevo León    60        Esquina
## 846                        Leches y Cremas Nuevo León    60        Esquina
## 847                           Papas Fritas Nuevo León    60        Esquina
## 848                       Jugos y Néctares Nuevo León    60        Esquina
## 849                            Lavatrastes Nuevo León    60        Esquina
## 850                           Papas Fritas Nuevo León    60        Esquina
## 851              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 852                       Leche Saborizada Nuevo León    60        Esquina
## 853                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 854                                Saladas Nuevo León    60        Esquina
## 855                              Chocolate Nuevo León    60        Esquina
## 856                                  Leche Nuevo León    60        Esquina
## 857                                Consome Nuevo León    60        Esquina
## 858                  Refrescos Retornables Nuevo León    60        Esquina
## 859                       Jugos y Néctares Nuevo León    60        Esquina
## 860              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 861                      Aguas Saborizadas Nuevo León    60        Esquina
## 862                            Pastelillos Nuevo León    60        Esquina
## 863                            Pastelillos Nuevo León    60        Esquina
## 864              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 865                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 866                              Populares Nuevo León    60        Esquina
## 867              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 868                                  Leche Nuevo León    60        Esquina
## 869                               Frituras Nuevo León    60        Esquina
## 870              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 871                             Chocolates Nuevo León    60        Esquina
## 872              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 873              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 874                  Refrescos Retornables Nuevo León    60        Esquina
## 875              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 876              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 877                  Refrescos Retornables Nuevo León    60        Esquina
## 878              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 879                                  Leche Nuevo León    60        Esquina
## 880                                 Yogurt Nuevo León    60        Esquina
## 881                  Refrescos Retornables Nuevo León    60        Esquina
## 882                  Refrescos Retornables Nuevo León    60        Esquina
## 883                               Frituras Nuevo León    60        Esquina
## 884                              Cajetilla Nuevo León    60        Esquina
## 885              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 886              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 887                           Papas Fritas Nuevo León    60        Esquina
## 888                  Refrescos Retornables Nuevo León    60        Esquina
## 889                        Cremas de Nieve Nuevo León    60        Esquina
## 890                                 Yogurt Nuevo León    60        Esquina
## 891              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 892              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 893                             Tropicales Nuevo León    60        Esquina
## 894                  Refrescos Retornables Nuevo León    60        Esquina
## 895                           Papas Fritas Nuevo León    60        Esquina
## 896                              Populares Nuevo León    60        Esquina
## 897                      Aguas Saborizadas Nuevo León    60        Esquina
## 898                                 Varios Nuevo León    60        Esquina
## 899                                   Lata Nuevo León    60        Esquina
## 900              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 901                         Cepillo Dental Nuevo León    60        Esquina
## 902                     Barras Energéticas Nuevo León    60        Esquina
## 903                   Limpiadores Líquidos Nuevo León    60        Esquina
## 904                             Lavandería Nuevo León    60        Esquina
## 905                       Chiles Envasados Nuevo León    60        Esquina
## 906                   Verduras y Vegetales Nuevo León    60        Esquina
## 907              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 908                   Verduras y Vegetales Nuevo León    60        Esquina
## 909                       Frijoles en Lata Nuevo León    60        Esquina
## 910                                  Arroz Nuevo León    60        Esquina
## 911                Productos sin Categoria Nuevo León    60        Esquina
## 912                      Aguas Saborizadas Nuevo León    60        Esquina
## 913                  Refrescos Retornables Nuevo León    60        Esquina
## 914                           Papas Fritas Nuevo León    60        Esquina
## 915              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 916                             Lavandería Nuevo León    60        Esquina
## 917                                 Yogurt Nuevo León    60        Esquina
## 918                                 Yogurt Nuevo León    60        Esquina
## 919                             Lavandería Nuevo León    60        Esquina
## 920                             Lavandería Nuevo León    60        Esquina
## 921                  Refrescos Retornables Nuevo León    60        Esquina
## 922                    Pan de Barra Blanco Nuevo León    60        Esquina
## 923              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 924              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 925                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 926                            Pastelillos Nuevo León    60        Esquina
## 927                       Leche Saborizada Nuevo León    60        Esquina
## 928                      Aguas Saborizadas Nuevo León    60        Esquina
## 929              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 930                       Jugos y Néctares Nuevo León    60        Esquina
## 931                                    Sal Nuevo León    60        Esquina
## 932             Energizantes e Hidratantes Nuevo León    60        Esquina
## 933                             Lavandería Nuevo León    60        Esquina
## 934                                  Leche Nuevo León    60        Esquina
## 935             Energizantes e Hidratantes Nuevo León    60        Esquina
## 936                Productos sin Categoria Nuevo León    60        Esquina
## 937                               Frituras Nuevo León    60        Esquina
## 938                       Chiles Envasados Nuevo León    60        Esquina
## 939                        Platos y Vasos  Nuevo León    60        Esquina
## 940                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 941                               Cerillos Nuevo León    60        Esquina
## 942                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 943              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 944  Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 945       Tortillas de Harina e Integrales Nuevo León    60        Esquina
## 946                                Chorizo Nuevo León    60        Esquina
## 947                  Refrescos Retornables Nuevo León    60        Esquina
## 948                  Refrescos Retornables Nuevo León    60        Esquina
## 949                    Blanqueador de Ropa Nuevo León    60        Esquina
## 950                        Papel Higiénico Nuevo León    60        Esquina
## 951                            Empanizador Nuevo León    60        Esquina
## 952                           Papas Fritas Nuevo León    60        Esquina
## 953                              Cajetilla Nuevo León    60        Esquina
## 954                            Frijol Bayo Nuevo León    60        Esquina
## 955             Energizantes e Hidratantes Nuevo León    60        Esquina
## 956                      Aguas Saborizadas Nuevo León    60        Esquina
## 957                       Jugos y Néctares Nuevo León    60        Esquina
## 958                               Frituras Nuevo León    60        Esquina
## 959                              Cajetilla Nuevo León    60        Esquina
## 960                             Tropicales Nuevo León    60        Esquina
## 961                               Tostadas Nuevo León    60        Esquina
## 962                  Refrescos Retornables Nuevo León    60        Esquina
## 963                               Frituras Nuevo León    60        Esquina
## 964                            Pastelillos Nuevo León    60        Esquina
## 965             Energizantes e Hidratantes Nuevo León    60        Esquina
## 966             Energizantes e Hidratantes Nuevo León    60        Esquina
## 967                             Chocolates Nuevo León    60        Esquina
## 968              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 969                  Refrescos Retornables Nuevo León    60        Esquina
## 970                       Jugos y Néctares Nuevo León    60        Esquina
## 971                              Cajetilla Nuevo León    60        Esquina
## 972              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 973              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 974                  Pan Dulce Empaquetado Nuevo León    60        Esquina
## 975              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 976                                 Cremas Nuevo León    60        Esquina
## 977                  Refrescos Retornables Nuevo León    60        Esquina
## 978                           Papas Fritas Nuevo León    60        Esquina
## 979                  Refrescos Retornables Nuevo León    60        Esquina
## 980              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 981                              Mayonesa  Nuevo León    60        Esquina
## 982  Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 983              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 984                                  Leche Nuevo León    60        Esquina
## 985                  Refrescos Retornables Nuevo León    60        Esquina
## 986                  Refrescos Retornables Nuevo León    60        Esquina
## 987                              Palomitas Nuevo León    60        Esquina
## 988              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 989              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 990                              Cajetilla Nuevo León    60        Esquina
## 991                       Leche Saborizada Nuevo León    60        Esquina
## 992              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 993                      Aguas Saborizadas Nuevo León    60        Esquina
## 994                            Frijol Bayo Nuevo León    60        Esquina
## 995              Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 996                                  Aguas Nuevo León    60        Esquina
## 997             Energizantes e Hidratantes Nuevo León    60        Esquina
## 998                  Refrescos Retornables Nuevo León    60        Esquina
## 999                            Pastelillos Nuevo León    60        Esquina
## 1000                 Refrescos Retornables Nuevo León    60        Esquina
## 1001                 Refrescos Retornables Nuevo León    60        Esquina
## 1002             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1003            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1004             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1005                      Frijoles en Lata Nuevo León    60        Esquina
## 1006                      Chiles Envasados Nuevo León    60        Esquina
## 1007             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1008                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 1009                 Concentrados en Polvo Nuevo León    60        Esquina
## 1010                      Leche Saborizada Nuevo León    60        Esquina
## 1011                             Mayonesa  Nuevo León    60        Esquina
## 1012                            Azucarados Nuevo León    60        Esquina
## 1013                 Refrescos Retornables Nuevo León    60        Esquina
## 1014                     Aguas Saborizadas Nuevo León    60        Esquina
## 1015                     Aguas Saborizadas Nuevo León    60        Esquina
## 1016             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1017                             Cajetilla Nuevo León    60        Esquina
## 1018                              Frituras Nuevo León    60        Esquina
## 1019                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1020                                 Jugos Nuevo León    60        Esquina
## 1021                      Jugos y Néctares Nuevo León    60        Esquina
## 1022                 Refrescos Retornables Nuevo León    60        Esquina
## 1023                                  Lata Nuevo León    60        Esquina
## 1024                      Jugos y Néctares Nuevo León    60        Esquina
## 1025                  Limpiadores Líquidos Nuevo León    60        Esquina
## 1026                 Refrescos Retornables Nuevo León    60        Esquina
## 1027             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1028             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1029             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1030                   Salchicha para Asar Nuevo León    60        Esquina
## 1031                  Salsa para Spaguetti Nuevo León    60        Esquina
## 1032                                 Arroz Nuevo León    60        Esquina
## 1033                 Refrescos Retornables Nuevo León    60        Esquina
## 1034                               Saladas Nuevo León    60        Esquina
## 1035                 Refrescos Retornables Nuevo León    60        Esquina
## 1036                 Refrescos Retornables Nuevo León    60        Esquina
## 1037                            Lavandería Nuevo León    60        Esquina
## 1038                Insecticidas y Venenos Nuevo León    60        Esquina
## 1039                                Yogurt Nuevo León    60        Esquina
## 1040             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1041                 Refrescos Retornables Nuevo León    60        Esquina
## 1042                 Refrescos Retornables Nuevo León    60        Esquina
## 1043                       Platos y Vasos  Nuevo León    60        Esquina
## 1044                       Platos y Vasos  Nuevo León    60        Esquina
## 1045                  Salsa para Spaguetti Nuevo León    60        Esquina
## 1046                 Refrescos Retornables Nuevo León    60        Esquina
## 1047             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1048                     Aguas Saborizadas Nuevo León    60        Esquina
## 1049                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1050                    Sopas Instantáneas Nuevo León    60        Esquina
## 1051                                Quesos Nuevo León    60        Esquina
## 1052                    Sopas Instantáneas Nuevo León    60        Esquina
## 1053                   Blanqueador de Ropa Nuevo León    60        Esquina
## 1054                 Concentrados en Polvo Nuevo León    60        Esquina
## 1055            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1056                 Concentrados en Polvo Nuevo León    60        Esquina
## 1057                                Cremas Nuevo León    60        Esquina
## 1058                    Sopas Instantáneas Nuevo León    60        Esquina
## 1059                               Saladas Nuevo León    60        Esquina
## 1060                 Refrescos Retornables Nuevo León    60        Esquina
## 1061                              Frituras Nuevo León    60        Esquina
## 1062                      Jugos y Néctares Nuevo León    60        Esquina
## 1063                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1064                 Refrescos Retornables Nuevo León    60        Esquina
## 1065                               Mostaza Nuevo León    60        Esquina
## 1066             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1067                 Refrescos Retornables Nuevo León    60        Esquina
## 1068                               Saladas Nuevo León    60        Esquina
## 1069             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1070                 Refrescos Retornables Nuevo León    60        Esquina
## 1071                              Frituras Nuevo León    60        Esquina
## 1072                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1073             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1074             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1075             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1076                                 Aguas Nuevo León    60        Esquina
## 1077             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1078                      Jugos y Néctares Nuevo León    60        Esquina
## 1079                               Saladas Nuevo León    60        Esquina
## 1080                      Jugos y Néctares Nuevo León    60        Esquina
## 1081                 Refrescos Retornables Nuevo León    60        Esquina
## 1082                 Refrescos Retornables Nuevo León    60        Esquina
## 1083                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 1084             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1085                        Salsa Botanera Nuevo León    60        Esquina
## 1086                 Refrescos Retornables Nuevo León    60        Esquina
## 1087            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1088                      Jugos y Néctares Nuevo León    60        Esquina
## 1089             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1090                                  Lata Nuevo León    60        Esquina
## 1091                              Frituras Nuevo León    60        Esquina
## 1092                              Frituras Nuevo León    60        Esquina
## 1093                              Frituras Nuevo León    60        Esquina
## 1094             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1095                  Salsa para Spaguetti Nuevo León    60        Esquina
## 1096                   Blanqueador de Ropa Nuevo León    60        Esquina
## 1097             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1098                 Refrescos Retornables Nuevo León    60        Esquina
## 1099             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1100                               Surtido Nuevo León    60        Esquina
## 1101             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1102                            Cacahuates Nuevo León    60        Esquina
## 1103                       Gomas de Mazcar Nuevo León    60        Esquina
## 1104                                  Maíz Nuevo León    60        Esquina
## 1105                     Aguas Saborizadas Nuevo León    60        Esquina
## 1106                              Frituras Nuevo León    60        Esquina
## 1107             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1108                      Jugos y Néctares Nuevo León    60        Esquina
## 1109                   Pastas de Figuritas Nuevo León    60        Esquina
## 1110                              Papillas Nuevo León    60        Esquina
## 1111               Productos sin Categoria Nuevo León    60        Esquina
## 1112                   Pan de Barra Blanco Nuevo León    60        Esquina
## 1113                 Refrescos Retornables Nuevo León    60        Esquina
## 1114                              Frituras Nuevo León    60        Esquina
## 1115                             Cajetilla Nuevo León    60        Esquina
## 1116                 Refrescos Retornables Nuevo León    60        Esquina
## 1117             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1118             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1119                                Nachos Nuevo León    60        Esquina
## 1120            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1121                          Papas Fritas Nuevo León    60        Esquina
## 1122                    Barras Energéticas Nuevo León    60        Esquina
## 1123            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1124                             Palomitas Nuevo León    60        Esquina
## 1125                              Frituras Nuevo León    60        Esquina
## 1126            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1127                               Surtido Nuevo León    60        Esquina
## 1128             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1129                                Quesos Nuevo León    60        Esquina
## 1130                                 Aguas Nuevo León    60        Esquina
## 1131             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1132             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1133                 Refrescos Retornables Nuevo León    60        Esquina
## 1134             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1135                      Jugos y Néctares Nuevo León    60        Esquina
## 1136             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1137                           Empanizador Nuevo León    60        Esquina
## 1138                      Jugos y Néctares Nuevo León    60        Esquina
## 1139               Productos sin Categoria Nuevo León    60        Esquina
## 1140                                 Aguas Nuevo León    60        Esquina
## 1141                                Cremas Nuevo León    60        Esquina
## 1142             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1143                            Lavandería Nuevo León    60        Esquina
## 1144             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1145                           Pastelillos Nuevo León    60        Esquina
## 1146                            Tropicales Nuevo León    60        Esquina
## 1147                    Comida para Perros Nuevo León    60        Esquina
## 1148                       Platos y Vasos  Nuevo León    60        Esquina
## 1149             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1150                       Platos y Vasos  Nuevo León    60        Esquina
## 1151                                Nachos Nuevo León    60        Esquina
## 1152                         Sal Combinada Nuevo León    60        Esquina
## 1153                 Refrescos Retornables Nuevo León    60        Esquina
## 1154                            Tropicales Nuevo León    60        Esquina
## 1155                       Platos y Vasos  Nuevo León    60        Esquina
## 1156                             Cajetilla Nuevo León    60        Esquina
## 1157                                  Atún Nuevo León    60        Esquina
## 1158                         Avena y Fibra Nuevo León    60        Esquina
## 1159                                Quesos Nuevo León    60        Esquina
## 1160             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1161             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1162                              Tostadas Nuevo León    60        Esquina
## 1163                       Platos y Vasos  Nuevo León    60        Esquina
## 1164                 Refrescos Retornables Nuevo León    60        Esquina
## 1165                   Cuidado del Cabello Nuevo León    60        Esquina
## 1166            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1167                             Cajetilla Nuevo León    60        Esquina
## 1168                      Jugos y Néctares Nuevo León    60        Esquina
## 1169                       Platos y Vasos  Nuevo León    60        Esquina
## 1170             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1171                                  Lata Nuevo León    60        Esquina
## 1172                          Papas Fritas Nuevo León    60        Esquina
## 1173                          Papas Fritas Nuevo León    60        Esquina
## 1174                              Frituras Nuevo León    60        Esquina
## 1175                                  Lata Nuevo León    60        Esquina
## 1176                           Empanizador Nuevo León    60        Esquina
## 1177             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1178                               Surtido Nuevo León    60        Esquina
## 1179                              Frituras Nuevo León    60        Esquina
## 1180                              Frituras Nuevo León    60        Esquina
## 1181            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1182                 Refrescos Retornables Nuevo León    60        Esquina
## 1183             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1184             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1185             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1186                              Frituras Nuevo León    60        Esquina
## 1187                                  Lata Nuevo León    60        Esquina
## 1188                                Charal Nuevo León    60        Esquina
## 1189                              Frituras Nuevo León    60        Esquina
## 1190                          Camarón Seco Nuevo León    60        Esquina
## 1191                               Saladas Nuevo León    60        Esquina
## 1192                  Limpiadores Líquidos Nuevo León    60        Esquina
## 1193                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1194                   Blanqueador de Ropa Nuevo León    60        Esquina
## 1195                  Limpiadores Líquidos Nuevo León    60        Esquina
## 1196                            Lavandería Nuevo León    60        Esquina
## 1197             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1198                            Lavandería Nuevo León    60        Esquina
## 1199                              Frituras Nuevo León    60        Esquina
## 1200                 Refrescos Retornables Nuevo León    60        Esquina
## 1201             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1202             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1203             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1204                       Platos y Vasos  Nuevo León    60        Esquina
## 1205                       Platos y Vasos  Nuevo León    60        Esquina
## 1206                     Aguas Saborizadas Nuevo León    60        Esquina
## 1207                          Papas Fritas Nuevo León    60        Esquina
## 1208             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1209                            Chile Seco Nuevo León    60        Esquina
## 1210                 Refrescos Retornables Nuevo León    60        Esquina
## 1211             Palomitas para Microondas Nuevo León    60        Esquina
## 1212                    Sopas Instantáneas Nuevo León    60        Esquina
## 1213             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1214                               Paletas Nuevo León    60        Esquina
## 1215                             Cajetilla Nuevo León    60        Esquina
## 1216                       Leches y Cremas Nuevo León    60        Esquina
## 1217                               Saladas Nuevo León    60        Esquina
## 1218                 Concentrados en Polvo Nuevo León    60        Esquina
## 1219                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 1220                         Sal Combinada Nuevo León    60        Esquina
## 1221                             Cajetilla Nuevo León    60        Esquina
## 1222                 Refrescos Retornables Nuevo León    60        Esquina
## 1223                          Papas Fritas Nuevo León    60        Esquina
## 1224                            Lavandería Nuevo León    60        Esquina
## 1225                               Consome Nuevo León    60        Esquina
## 1226             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1227                            Chocolates Nuevo León    60        Esquina
## 1228                                  Lata Nuevo León    60        Esquina
## 1229             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1230                            Cacahuates Nuevo León    60        Esquina
## 1231                      Leche Saborizada Nuevo León    60        Esquina
## 1232             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1233                              Frituras Nuevo León    60        Esquina
## 1234                     Aguas Saborizadas Nuevo León    60        Esquina
## 1235             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1236                 Refrescos Retornables Nuevo León    60        Esquina
## 1237             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1238                              Frituras Nuevo León    60        Esquina
## 1239                 Refrescos Retornables Nuevo León    60        Esquina
## 1240                 Refrescos Retornables Nuevo León    60        Esquina
## 1241                 Refrescos Retornables Nuevo León    60        Esquina
## 1242                             Cajetilla Nuevo León    60        Esquina
## 1243                 Refrescos Retornables Nuevo León    60        Esquina
## 1244                              Frituras Nuevo León    60        Esquina
## 1245                    Sopas Instantáneas Nuevo León    60        Esquina
## 1246                       Papel Higiénico Nuevo León    60        Esquina
## 1247                               Surtido Nuevo León    60        Esquina
## 1248                 Refrescos Retornables Nuevo León    60        Esquina
## 1249                              Frituras Nuevo León    60        Esquina
## 1250             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1251                            Cacahuates Nuevo León    60        Esquina
## 1252                                Azúcar Nuevo León    60        Esquina
## 1253             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1254                Insecticidas y Venenos Nuevo León    60        Esquina
## 1255                 Refrescos Retornables Nuevo León    60        Esquina
## 1256                  Salsa para Spaguetti Nuevo León    60        Esquina
## 1257                       Platos y Vasos  Nuevo León    60        Esquina
## 1258             Palomitas para Microondas Nuevo León    60        Esquina
## 1259                       Platos y Vasos  Nuevo León    60        Esquina
## 1260                           Pastelillos Nuevo León    60        Esquina
## 1261                 Refrescos Retornables Nuevo León    60        Esquina
## 1262               Productos sin Categoria Nuevo León    60        Esquina
## 1263               Productos sin Categoria Nuevo León    60        Esquina
## 1264                             Cajetilla Nuevo León    60        Esquina
## 1265                              Frituras Nuevo León    60        Esquina
## 1266                            Cacahuates Nuevo León    60        Esquina
## 1267                              Frituras Nuevo León    60        Esquina
## 1268                              Frituras Nuevo León    60        Esquina
## 1269                 Refrescos Retornables Nuevo León    60        Esquina
## 1270                            Cacahuates Nuevo León    60        Esquina
## 1271                          Papas Fritas Nuevo León    60        Esquina
## 1272                 Refrescos Retornables Nuevo León    60        Esquina
## 1273                    Sopas Instantáneas Nuevo León    60        Esquina
## 1274             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1275                 Refrescos Retornables Nuevo León    60        Esquina
## 1276                          Papas Fritas Nuevo León    60        Esquina
## 1277                              Tostadas Nuevo León    60        Esquina
## 1278                 Refrescos Retornables Nuevo León    60        Esquina
## 1279             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1280                              Tostadas Nuevo León    60        Esquina
## 1281                                Cremas Nuevo León    60        Esquina
## 1282                             Cajetilla Nuevo León    60        Esquina
## 1283                           Pastelillos Nuevo León    60        Esquina
## 1284                                 Leche Nuevo León    60        Esquina
## 1285                             Cajetilla Nuevo León    60        Esquina
## 1286             Palomitas para Microondas Nuevo León    60        Esquina
## 1287             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1288                             Mayonesa  Nuevo León    60        Esquina
## 1289                   Pan de Barra Blanco Nuevo León    60        Esquina
## 1290                                Quesos Nuevo León    60        Esquina
## 1291                 Refrescos Retornables Nuevo León    60        Esquina
## 1292                              Rellenas Nuevo León    60        Esquina
## 1293                          Puré de Papa Nuevo León    60        Esquina
## 1294                                Cremas Nuevo León    60        Esquina
## 1295                 Refrescos Retornables Nuevo León    60        Esquina
## 1296                 Refrescos Retornables Nuevo León    60        Esquina
## 1297             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1298                 Refrescos Retornables Nuevo León    60        Esquina
## 1299                          Papas Fritas Nuevo León    60        Esquina
## 1300                 Refrescos Retornables Nuevo León    60        Esquina
## 1301                                 Aguas Nuevo León    60        Esquina
## 1302             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1303               Productos sin Categoria Nuevo León    60        Esquina
## 1304                    Sopas Instantáneas Nuevo León    60        Esquina
## 1305             Palomitas para Microondas Nuevo León    60        Esquina
## 1306             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1307             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1308             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1309             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1310             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1311                      Jugos y Néctares Nuevo León    60        Esquina
## 1312             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1313                        Salsa Botanera Nuevo León    60        Esquina
## 1314                           Pastelillos Nuevo León    60        Esquina
## 1315                    Sopas Instantáneas Nuevo León    60        Esquina
## 1316                 Refrescos Retornables Nuevo León    60        Esquina
## 1317             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1318                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1319             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1320                 Refrescos Retornables Nuevo León    60        Esquina
## 1321               Productos sin Categoria Nuevo León    60        Esquina
## 1322                 Concentrados en Polvo Nuevo León    60        Esquina
## 1323                             Cajetilla Nuevo León    60        Esquina
## 1324                          Papas Fritas Nuevo León    60        Esquina
## 1325                                Nachos Nuevo León    60        Esquina
## 1326                          Papas Fritas Nuevo León    60        Esquina
## 1327                  Verduras y Vegetales Nuevo León    60        Esquina
## 1328                 Afeitado y Depilación Nuevo León    60        Esquina
## 1329                                 Arroz Nuevo León    60        Esquina
## 1330                             Cajetilla Nuevo León    60        Esquina
## 1331                          Papas Fritas Nuevo León    60        Esquina
## 1332                                 Aguas Nuevo León    60        Esquina
## 1333                               Surtido Nuevo León    60        Esquina
## 1334             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1335                             Cajetilla Nuevo León    60        Esquina
## 1336                 Refrescos Retornables Nuevo León    60        Esquina
## 1337            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1338                            Malvavisco Nuevo León    60        Esquina
## 1339                                 Leche Nuevo León    60        Esquina
## 1340                               Saladas Nuevo León    60        Esquina
## 1341                             Cajetilla Nuevo León    60        Esquina
## 1342             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1343         Fideos, Spaguetti, Tallarines Nuevo León    60        Esquina
## 1344                              Frituras Nuevo León    60        Esquina
## 1345             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1346            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1347                       Platos y Vasos  Nuevo León    60        Esquina
## 1348                       Platos y Vasos  Nuevo León    60        Esquina
## 1349                 Refrescos Retornables Nuevo León    60        Esquina
## 1350                           Pastelillos Nuevo León    60        Esquina
## 1351                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1352                 Refrescos Retornables Nuevo León    60        Esquina
## 1353                 Refrescos Retornables Nuevo León    60        Esquina
## 1354             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1355                             Chocolate Nuevo León    60        Esquina
## 1356                  Limpiadores Líquidos Nuevo León    60        Esquina
## 1357                           Lavatrastes Nuevo León    60        Esquina
## 1358             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1359             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1360             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1361                              Frituras Nuevo León    60        Esquina
## 1362                      Jugos y Néctares Nuevo León    60        Esquina
## 1363                            Lavandería Nuevo León    60        Esquina
## 1364                 Refrescos Retornables Nuevo León    60        Esquina
## 1365                     Aguas Saborizadas Nuevo León    60        Esquina
## 1366                                 Aguas Nuevo León    60        Esquina
## 1367             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1368 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 1369                              Frituras Nuevo León    60        Esquina
## 1370                          Papas Fritas Nuevo León    60        Esquina
## 1371                     Refrescos en Lata Nuevo León    60        Esquina
## 1372                             Cajetilla Nuevo León    60        Esquina
## 1373                      Jugos y Néctares Nuevo León    60        Esquina
## 1374                          Papas Fritas Nuevo León    60        Esquina
## 1375             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1376                 Refrescos Retornables Nuevo León    60        Esquina
## 1377                   Pan de Barra Blanco Nuevo León    60        Esquina
## 1378                               Saladas Nuevo León    60        Esquina
## 1379                              Frituras Nuevo León    60        Esquina
## 1380             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1381                          Papas Fritas Nuevo León    60        Esquina
## 1382                  Limpiadores Líquidos Nuevo León    60        Esquina
## 1383             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1384                                Quesos Nuevo León    60        Esquina
## 1385                       Cremas de Nieve Nuevo León    60        Esquina
## 1386                           Lavatrastes Nuevo León    60        Esquina
## 1387            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1388                 Refrescos Retornables Nuevo León    60        Esquina
## 1389                            Lavandería Nuevo León    60        Esquina
## 1390                            Lavandería Nuevo León    60        Esquina
## 1391                 Refrescos Retornables Nuevo León    60        Esquina
## 1392                            Lavandería Nuevo León    60        Esquina
## 1393                           Lavatrastes Nuevo León    60        Esquina
## 1394                 Refrescos Retornables Nuevo León    60        Esquina
## 1395               Productos sin Categoria Nuevo León    60        Esquina
## 1396             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1397                 Refrescos Retornables Nuevo León    60        Esquina
## 1398             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1399                               Surtido Nuevo León    60        Esquina
## 1400                          Papas Fritas Nuevo León    60        Esquina
## 1401             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1402                     Refrescos en Lata Nuevo León    60        Esquina
## 1403             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1404                               Paletas Nuevo León    60        Esquina
## 1405                             Chiclosos Nuevo León    60        Esquina
## 1406                   Pastas de Figuritas Nuevo León    60        Esquina
## 1407                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1408                                Yogurt Nuevo León    60        Esquina
## 1409                         Tradicionales Nuevo León    60        Esquina
## 1410                     Aguas Saborizadas Nuevo León    60        Esquina
## 1411                 Concentrados en Polvo Nuevo León    60        Esquina
## 1412                             Cajetilla Nuevo León    60        Esquina
## 1413             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1414                  Limpiadores Líquidos Nuevo León    60        Esquina
## 1415             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1416                            Chocolates Nuevo León    60        Esquina
## 1417            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1418             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1419                      Jugos y Néctares Nuevo León    60        Esquina
## 1420                          Papas Fritas Nuevo León    60        Esquina
## 1421                           Lavatrastes Nuevo León    60        Esquina
## 1422                                 Leche Nuevo León    60        Esquina
## 1423             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1424             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1425             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1426             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1427                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1428                                Azúcar Nuevo León    60        Esquina
## 1429                          Papas Fritas Nuevo León    60        Esquina
## 1430                 Refrescos Retornables Nuevo León    60        Esquina
## 1431                                 Leche Nuevo León    60        Esquina
## 1432             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1433               Productos sin Categoria Nuevo León    60        Esquina
## 1434                             Cajetilla Nuevo León    60        Esquina
## 1435                             Pastillas Nuevo León    60        Esquina
## 1436             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1437                      Jugos y Néctares Nuevo León    60        Esquina
## 1438             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1439                       Platos y Vasos  Nuevo León    60        Esquina
## 1440                       Platos y Vasos  Nuevo León    60        Esquina
## 1441                             Cajetilla Nuevo León    60        Esquina
## 1442             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1443                          Papas Fritas Nuevo León    60        Esquina
## 1444                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1445                             Cajetilla Nuevo León    60        Esquina
## 1446                 Refrescos Retornables Nuevo León    60        Esquina
## 1447                      Jugos y Néctares Nuevo León    60        Esquina
## 1448                         Sal Combinada Nuevo León    60        Esquina
## 1449            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1450             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1451             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1452                          Papas Fritas Nuevo León    60        Esquina
## 1453                                 Aguas Nuevo León    60        Esquina
## 1454                             Cajetilla Nuevo León    60        Esquina
## 1455                             Chocolate Nuevo León    60        Esquina
## 1456                               Surtido Nuevo León    60        Esquina
## 1457             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1458                              Frituras Nuevo León    60        Esquina
## 1459                      Leche Saborizada Nuevo León    60        Esquina
## 1460                   Pastas de Figuritas Nuevo León    60        Esquina
## 1461                Insecticidas y Venenos Nuevo León    60        Esquina
## 1462                               Consome Nuevo León    60        Esquina
## 1463                                Azúcar Nuevo León    60        Esquina
## 1464                                Quesos Nuevo León    60        Esquina
## 1465                                   Sal Nuevo León    60        Esquina
## 1466             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1467             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1468             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1469                                 Leche Nuevo León    60        Esquina
## 1470            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1471                             Mayonesa  Nuevo León    60        Esquina
## 1472                      Leche Saborizada Nuevo León    60        Esquina
## 1473                 Refrescos Retornables Nuevo León    60        Esquina
## 1474                          Papas Fritas Nuevo León    60        Esquina
## 1475                           Pastelillos Nuevo León    60        Esquina
## 1476                      Jugos y Néctares Nuevo León    60        Esquina
## 1477                             Cajetilla Nuevo León    60        Esquina
## 1478             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1479                                Yogurt Nuevo León    60        Esquina
## 1480                      Chiles Envasados Nuevo León    60        Esquina
## 1481                             Cajetilla Nuevo León    60        Esquina
## 1482                   Cuidado del Cabello Nuevo León    60        Esquina
## 1483               Productos sin Categoria Nuevo León    60        Esquina
## 1484                      Leche Saborizada Nuevo León    60        Esquina
## 1485                                Yogurt Nuevo León    60        Esquina
## 1486                           Lavatrastes Nuevo León    60        Esquina
## 1487                 Refrescos Retornables Nuevo León    60        Esquina
## 1488                              Frituras Nuevo León    60        Esquina
## 1489                    Comida para Perros Nuevo León    60        Esquina
## 1490                               Surtido Nuevo León    60        Esquina
## 1491             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1492                           Pastelillos Nuevo León    60        Esquina
## 1493                              Frituras Nuevo León    60        Esquina
## 1494             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1495                               Saladas Nuevo León    60        Esquina
## 1496             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1497                             Cajetilla Nuevo León    60        Esquina
## 1498                 Refrescos Retornables Nuevo León    60        Esquina
## 1499                 Refrescos Retornables Nuevo León    60        Esquina
## 1500             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1501             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1502             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1503                             Cajetilla Nuevo León    60        Esquina
## 1504                Pan Tostado y Crotones Nuevo León    60        Esquina
## 1505                             Cajetilla Nuevo León    60        Esquina
## 1506                          Papas Fritas Nuevo León    60        Esquina
## 1507             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1508                     Aguas Saborizadas Nuevo León    60        Esquina
## 1509                              Frituras Nuevo León    60        Esquina
## 1510                                 Leche Nuevo León    60        Esquina
## 1511                                Quesos Nuevo León    60        Esquina
## 1512                                 Aguas Nuevo León    60        Esquina
## 1513                      Jugos y Néctares Nuevo León    60        Esquina
## 1514                           Pastelillos Nuevo León    60        Esquina
## 1515                                Yogurt Nuevo León    60        Esquina
## 1516             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1517                 Pan de Barra Integral Nuevo León    60        Esquina
## 1518                 Refrescos Retornables Nuevo León    60        Esquina
## 1519                      Jugos y Néctares Nuevo León    60        Esquina
## 1520                      Jugos y Néctares Nuevo León    60        Esquina
## 1521                           Sazonadores Nuevo León    60        Esquina
## 1522             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1523                         Frijol Varios Nuevo León    60        Esquina
## 1524             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1525                 Refrescos Retornables Nuevo León    60        Esquina
## 1526             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1527                                  Lata Nuevo León    60        Esquina
## 1528             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1529                               Consome Nuevo León    60        Esquina
## 1530                       Platos y Vasos  Nuevo León    60        Esquina
## 1531                       Platos y Vasos  Nuevo León    60        Esquina
## 1532                              Frituras Nuevo León    60        Esquina
## 1533                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1534                              Frituras Nuevo León    60        Esquina
## 1535                      Chiles Envasados Nuevo León    60        Esquina
## 1536                            Lavandería Nuevo León    60        Esquina
## 1537                         Jamón de Pavo Nuevo León    60        Esquina
## 1538                 Refrescos Retornables Nuevo León    60        Esquina
## 1539                              Frituras Nuevo León    60        Esquina
## 1540                          Papas Fritas Nuevo León    60        Esquina
## 1541                   Blanqueador de Ropa Nuevo León    60        Esquina
## 1542            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1543                              Frituras Nuevo León    60        Esquina
## 1544            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1545                     Aguas Saborizadas Nuevo León    60        Esquina
## 1546                                 Aguas Nuevo León    60        Esquina
## 1547                             Cajetilla Nuevo León    60        Esquina
## 1548                 Refrescos Retornables Nuevo León    60        Esquina
## 1549             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1550             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1551                   Cuidado del Cabello Nuevo León    60        Esquina
## 1552                 Afeitado y Depilación Nuevo León    60        Esquina
## 1553                           Pastelillos Nuevo León    60        Esquina
## 1554                           Pastelillos Nuevo León    60        Esquina
## 1555             Palomitas para Microondas Nuevo León    60        Esquina
## 1556                     Aguas Saborizadas Nuevo León    60        Esquina
## 1557                           Pastelillos Nuevo León    60        Esquina
## 1558                              Frituras Nuevo León    60        Esquina
## 1559                             Cajetilla Nuevo León    60        Esquina
## 1560                 Refrescos Retornables Nuevo León    60        Esquina
## 1561                          Papas Fritas Nuevo León    60        Esquina
## 1562             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1563                   Pastas de Figuritas Nuevo León    60        Esquina
## 1564             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1565             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1566              Salchicha HotDog y Viena Nuevo León    60        Esquina
## 1567                  Salsa para Spaguetti Nuevo León    60        Esquina
## 1568                         Frijol Varios Nuevo León    60        Esquina
## 1569                     Aguas Saborizadas Nuevo León    60        Esquina
## 1570             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1571                  Limpiadores Líquidos Nuevo León    60        Esquina
## 1572                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 1573                 Refrescos Retornables Nuevo León    60        Esquina
## 1574                 Concentrados en Polvo Nuevo León    60        Esquina
## 1575                      Jugos y Néctares Nuevo León    60        Esquina
## 1576             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1577             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1578            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1579                         Tradicionales Nuevo León    60        Esquina
## 1580                                 Leche Nuevo León    60        Esquina
## 1581                            Tropicales Nuevo León    60        Esquina
## 1582                              Frituras Nuevo León    60        Esquina
## 1583             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1584                 Pan de Barra Integral Nuevo León    60        Esquina
## 1585                                Quesos Nuevo León    60        Esquina
## 1586                               Surtido Nuevo León    60        Esquina
## 1587                            Cacahuates Nuevo León    60        Esquina
## 1588                            Chocolates Nuevo León    60        Esquina
## 1589             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1590                            Lavandería Nuevo León    60        Esquina
## 1591                            Lavandería Nuevo León    60        Esquina
## 1592                         Jamón de Pavo Nuevo León    60        Esquina
## 1593                   Pan de Barra Blanco Nuevo León    60        Esquina
## 1594                                Quesos Nuevo León    60        Esquina
## 1595             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1596                 Refrescos Retornables Nuevo León    60        Esquina
## 1597                                 Leche Nuevo León    60        Esquina
## 1598             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1599                 Pan de Barra Integral Nuevo León    60        Esquina
## 1600                                 Leche Nuevo León    60        Esquina
## 1601                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1602                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1603                                 Leche Nuevo León    60        Esquina
## 1604                         Tradicionales Nuevo León    60        Esquina
## 1605             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1606             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1607                 Concentrados en Polvo Nuevo León    60        Esquina
## 1608                         Tradicionales Nuevo León    60        Esquina
## 1609                                 Aguas Nuevo León    60        Esquina
## 1610                 Refrescos Retornables Nuevo León    60        Esquina
## 1611                 Refrescos Retornables Nuevo León    60        Esquina
## 1612             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1613             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1614             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1615                    Barras Energéticas Nuevo León    60        Esquina
## 1616                 Refrescos Retornables Nuevo León    60        Esquina
## 1617                 Refrescos Retornables Nuevo León    60        Esquina
## 1618             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1619                             Cajetilla Nuevo León    60        Esquina
## 1620                         Frijol Varios Nuevo León    60        Esquina
## 1621                      Leche Saborizada Nuevo León    60        Esquina
## 1622                            Chocolates Nuevo León    60        Esquina
## 1623                       Platos y Vasos  Nuevo León    60        Esquina
## 1624             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1625             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1626                                  Café Nuevo León    60        Esquina
## 1627                      Leche Saborizada Nuevo León    60        Esquina
## 1628             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1629                                 Leche Nuevo León    60        Esquina
## 1630                      Jugos y Néctares Nuevo León    60        Esquina
## 1631             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1632                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1633                 Concentrados en Polvo Nuevo León    60        Esquina
## 1634                                 Leche Nuevo León    60        Esquina
## 1635                             Pastillas Nuevo León    60        Esquina
## 1636             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1637             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1638                           Lavatrastes Nuevo León    60        Esquina
## 1639                   Cuidado del Cabello Nuevo León    60        Esquina
## 1640                          Papas Fritas Nuevo León    60        Esquina
## 1641                             Cajetilla Nuevo León    60        Esquina
## 1642                             Cajetilla Nuevo León    60        Esquina
## 1643             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1644             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1645             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1646                      Leche Saborizada Nuevo León    60        Esquina
## 1647             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1648                                Azúcar Nuevo León    60        Esquina
## 1649                           Empanizador Nuevo León    60        Esquina
## 1650                               Consome Nuevo León    60        Esquina
## 1651             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1652                 Refrescos Retornables Nuevo León    60        Esquina
## 1653                 Refrescos Retornables Nuevo León    60        Esquina
## 1654                 Refrescos Retornables Nuevo León    60        Esquina
## 1655                 Refrescos Retornables Nuevo León    60        Esquina
## 1656                 Refrescos Retornables Nuevo León    60        Esquina
## 1657                 Refrescos Retornables Nuevo León    60        Esquina
## 1658                             Cajetilla Nuevo León    60        Esquina
## 1659                      Jugos y Néctares Nuevo León    60        Esquina
## 1660                             Cajetilla Nuevo León    60        Esquina
## 1661             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1662                             Cajetilla Nuevo León    60        Esquina
## 1663             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1664                      Jugos y Néctares Nuevo León    60        Esquina
## 1665                       Platos y Vasos  Nuevo León    60        Esquina
## 1666             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1667             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1668                             Cajetilla Nuevo León    60        Esquina
## 1669                             Cajetilla Nuevo León    60        Esquina
## 1670             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1671                           Empanizador Nuevo León    60        Esquina
## 1672             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1673                             Cajetilla Nuevo León    60        Esquina
## 1674                    Sopas Instantáneas Nuevo León    60        Esquina
## 1675                     Refrescos en Lata Nuevo León    60        Esquina
## 1676                     Refrescos en Lata Nuevo León    60        Esquina
## 1677                             Cajetilla Nuevo León    60        Esquina
## 1678                    Comida para Perros Nuevo León    60        Esquina
## 1679                               Saladas Nuevo León    60        Esquina
## 1680             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1681             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1682                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1683             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1684            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1685                 Refrescos Retornables Nuevo León    60        Esquina
## 1686 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 1687                             Cajetilla Nuevo León    60        Esquina
## 1688                 Concentrados en Polvo Nuevo León    60        Esquina
## 1689             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1690               Productos sin Categoria Nuevo León    60        Esquina
## 1691             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1692                      Jugos y Néctares Nuevo León    60        Esquina
## 1693               Productos sin Categoria Nuevo León    60        Esquina
## 1694             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1695                  Postres Refrigerados Nuevo León    60        Esquina
## 1696            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1697             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1698                                 Aguas Nuevo León    60        Esquina
## 1699                            Chocolates Nuevo León    60        Esquina
## 1700             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1701                          Papas Fritas Nuevo León    60        Esquina
## 1702                                 Leche Nuevo León    60        Esquina
## 1703                 Refrescos Retornables Nuevo León    60        Esquina
## 1704                                 Leche Nuevo León    60        Esquina
## 1705                         Sal Combinada Nuevo León    60        Esquina
## 1706             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1707                          Papas Fritas Nuevo León    60        Esquina
## 1708                  Chicharrón de Harina Nuevo León    60        Esquina
## 1709                          Papas Fritas Nuevo León    60        Esquina
## 1710                  Limpiadores Líquidos Nuevo León    60        Esquina
## 1711                 Refrescos Retornables Nuevo León    60        Esquina
## 1712                           Frijol Bayo Nuevo León    60        Esquina
## 1713                   Blanqueador de Ropa Nuevo León    60        Esquina
## 1714                              Papillas Nuevo León    60        Esquina
## 1715                            Lavandería Nuevo León    60        Esquina
## 1716             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1717             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1718                 Refrescos Retornables Nuevo León    60        Esquina
## 1719             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1720                                 Aguas Nuevo León    60        Esquina
## 1721             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1722                           Empanizador Nuevo León    60        Esquina
## 1723                                 Aguas Nuevo León    60        Esquina
## 1724                           Mantequilla Nuevo León    60        Esquina
## 1725                           Mantequilla Nuevo León    60        Esquina
## 1726             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1727                                 Trigo Nuevo León    60        Esquina
## 1728                 Refrescos Retornables Nuevo León    60        Esquina
## 1729                                 Leche Nuevo León    60        Esquina
## 1730                 Refrescos Retornables Nuevo León    60        Esquina
## 1731                 Refrescos Retornables Nuevo León    60        Esquina
## 1732                          Dulce Macizo Nuevo León    60        Esquina
## 1733                            Chocolates Nuevo León    60        Esquina
## 1734                            Lavandería Nuevo León    60        Esquina
## 1735                          Papas Fritas Nuevo León    60        Esquina
## 1736                              Semillas Nuevo León    60        Esquina
## 1737             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1738                               Consome Nuevo León    60        Esquina
## 1739                 Concentrados en Polvo Nuevo León    60        Esquina
## 1740                 Refrescos Retornables Nuevo León    60        Esquina
## 1741                 Refrescos Retornables Nuevo León    60        Esquina
## 1742                 Refrescos Retornables Nuevo León    60        Esquina
## 1743                         Frijol Varios Nuevo León    60        Esquina
## 1744                               Saladas Nuevo León    60        Esquina
## 1745                                  Atún Nuevo León    60        Esquina
## 1746                               Paletas Nuevo León    60        Esquina
## 1747             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1748                                  Mole Nuevo León    60        Esquina
## 1749                            Lavandería Nuevo León    60        Esquina
## 1750                            Lavandería Nuevo León    60        Esquina
## 1751                              Frituras Nuevo León    60        Esquina
## 1752                            Malvavisco Nuevo León    60        Esquina
## 1753             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1754             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1755                           Frijol Bayo Nuevo León    60        Esquina
## 1756                             Cajetilla Nuevo León    60        Esquina
## 1757                  Limpiadores Líquidos Nuevo León    60        Esquina
## 1758                           Lavatrastes Nuevo León    60        Esquina
## 1759                           Servilletas Nuevo León    60        Esquina
## 1760                             Cajetilla Nuevo León    60        Esquina
## 1761                      Jugos y Néctares Nuevo León    60        Esquina
## 1762                              Frituras Nuevo León    60        Esquina
## 1763                            Lavandería Nuevo León    60        Esquina
## 1764                          Papas Fritas Nuevo León    60        Esquina
## 1765                                Azúcar Nuevo León    60        Esquina
## 1766                             Chocolate Nuevo León    60        Esquina
## 1767                              Frituras Nuevo León    60        Esquina
## 1768             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1769             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1770             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1771                      Leche Saborizada Nuevo León    60        Esquina
## 1772                         Sal Combinada Nuevo León    60        Esquina
## 1773                 Refrescos Retornables Nuevo León    60        Esquina
## 1774                               Consome Nuevo León    60        Esquina
## 1775             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1776             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1777                      Frijoles en Lata Nuevo León    60        Esquina
## 1778                 Refrescos Retornables Nuevo León    60        Esquina
## 1779                 Refrescos Retornables Nuevo León    60        Esquina
## 1780                               Consome Nuevo León    60        Esquina
## 1781                            Lavandería Nuevo León    60        Esquina
## 1782                             Cajetilla Nuevo León    60        Esquina
## 1783                 Refrescos Retornables Nuevo León    60        Esquina
## 1784                 Refrescos Retornables Nuevo León    60        Esquina
## 1785                              Frituras Nuevo León    60        Esquina
## 1786                             Cajetilla Nuevo León    60        Esquina
## 1787                              Semillas Nuevo León    60        Esquina
## 1788                    Barras Energéticas Nuevo León    60        Esquina
## 1789                               Saladas Nuevo León    60        Esquina
## 1790                      Jugos y Néctares Nuevo León    60        Esquina
## 1791                 Refrescos Retornables Nuevo León    60        Esquina
## 1792                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1793                            Malvavisco Nuevo León    60        Esquina
## 1794             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1795                           Pastelillos Nuevo León    60        Esquina
## 1796                            Malvavisco Nuevo León    60        Esquina
## 1797                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 1798             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1799             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1800             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1801                             Cajetilla Nuevo León    60        Esquina
## 1802                                 Leche Nuevo León    60        Esquina
## 1803                           Empanizador Nuevo León    60        Esquina
## 1804                                Quesos Nuevo León    60        Esquina
## 1805                  Chicharrón de Harina Nuevo León    60        Esquina
## 1806                              Frituras Nuevo León    60        Esquina
## 1807                    Comida para Perros Nuevo León    60        Esquina
## 1808                 Refrescos Retornables Nuevo León    60        Esquina
## 1809                       Papel Higiénico Nuevo León    60        Esquina
## 1810                 Refrescos Retornables Nuevo León    60        Esquina
## 1811                          Papas Fritas Nuevo León    60        Esquina
## 1812             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1813                              Frituras Nuevo León    60        Esquina
## 1814                      Jugos y Néctares Nuevo León    60        Esquina
## 1815                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1816                                 Leche Nuevo León    60        Esquina
## 1817                 Refrescos Retornables Nuevo León    60        Esquina
## 1818                             Cajetilla Nuevo León    60        Esquina
## 1819             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1820 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 1821                            Lavandería Nuevo León    60        Esquina
## 1822                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1823                            Lavandería Nuevo León    60        Esquina
## 1824             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1825             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1826                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1827                             Mayonesa  Nuevo León    60        Esquina
## 1828             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1829             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1830                             Cajetilla Nuevo León    60        Esquina
## 1831             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1832                       Papel Higiénico Nuevo León    60        Esquina
## 1833                             Cajetilla Nuevo León    60        Esquina
## 1834             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1835                      Jugos y Néctares Nuevo León    60        Esquina
## 1836                      Jugos y Néctares Nuevo León    60        Esquina
## 1837                           Pastelillos Nuevo León    60        Esquina
## 1838                          Papas Fritas Nuevo León    60        Esquina
## 1839                  Chicharrón de Harina Nuevo León    60        Esquina
## 1840             Palomitas para Microondas Nuevo León    60        Esquina
## 1841                                 Aguas Nuevo León    60        Esquina
## 1842             Palomitas para Microondas Nuevo León    60        Esquina
## 1843                              Frituras Nuevo León    60        Esquina
## 1844             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1845             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1846             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1847             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1848                      Frijoles en Lata Nuevo León    60        Esquina
## 1849             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1850                 Refrescos Retornables Nuevo León    60        Esquina
## 1851                        Leche en Polvo Nuevo León    60        Esquina
## 1852                      Jugos y Néctares Nuevo León    60        Esquina
## 1853                             Chocolate Nuevo León    60        Esquina
## 1854                    Sopas Instantáneas Nuevo León    60        Esquina
## 1855                          Papas Fritas Nuevo León    60        Esquina
## 1856                    Sopas Instantáneas Nuevo León    60        Esquina
## 1857             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1858                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1859             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1860                 Refrescos Retornables Nuevo León    60        Esquina
## 1861                          Papas Fritas Nuevo León    60        Esquina
## 1862            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1863             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1864                 Refrescos Retornables Nuevo León    60        Esquina
## 1865                             Cajetilla Nuevo León    60        Esquina
## 1866                          Papas Fritas Nuevo León    60        Esquina
## 1867                 Refrescos Retornables Nuevo León    60        Esquina
## 1868                                Charal Nuevo León    60        Esquina
## 1869             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1870                                 Leche Nuevo León    60        Esquina
## 1871             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1872             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1873             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1874                                   Sal Nuevo León    60        Esquina
## 1875                           Pastelillos Nuevo León    60        Esquina
## 1876                    Sopas Instantáneas Nuevo León    60        Esquina
## 1877             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1878             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1879                              Rellenas Nuevo León    60        Esquina
## 1880             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1881                      Jugos y Néctares Nuevo León    60        Esquina
## 1882               Productos sin Categoria Nuevo León    60        Esquina
## 1883                          Papas Fritas Nuevo León    60        Esquina
## 1884                 Refrescos Retornables Nuevo León    60        Esquina
## 1885             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1886                 Concentrados en Polvo Nuevo León    60        Esquina
## 1887                 Concentrados en Polvo Nuevo León    60        Esquina
## 1888                    Harina para Pastel Nuevo León    60        Esquina
## 1889                      Jugos y Néctares Nuevo León    60        Esquina
## 1890                                Polvos Nuevo León    60        Esquina
## 1891             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1892                 Refrescos Retornables Nuevo León    60        Esquina
## 1893                            Lavandería Nuevo León    60        Esquina
## 1894             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1895                      Jugos y Néctares Nuevo León    60        Esquina
## 1896                   Pan de Barra Blanco Nuevo León    60        Esquina
## 1897                             Mayonesa  Nuevo León    60        Esquina
## 1898                 Concentrados en Polvo Nuevo León    60        Esquina
## 1899                          Papas Fritas Nuevo León    60        Esquina
## 1900             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1901             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1902                             Cajetilla Nuevo León    60        Esquina
## 1903             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1904             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1905                            Chocolates Nuevo León    60        Esquina
## 1906             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1907                           Pastelillos Nuevo León    60        Esquina
## 1908                                 Leche Nuevo León    60        Esquina
## 1909                                   Sal Nuevo León    60        Esquina
## 1910            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1911                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1912             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1913                               Paletas Nuevo León    60        Esquina
## 1914             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1915                          Papas Fritas Nuevo León    60        Esquina
## 1916                      Leche Saborizada Nuevo León    60        Esquina
## 1917                          Papas Fritas Nuevo León    60        Esquina
## 1918                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1919             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1920             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1921             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1922                      Leche Saborizada Nuevo León    60        Esquina
## 1923                             Cajetilla Nuevo León    60        Esquina
## 1924                 Concentrados en Polvo Nuevo León    60        Esquina
## 1925                   Pan de Barra Blanco Nuevo León    60        Esquina
## 1926                             Cajetilla Nuevo León    60        Esquina
## 1927                  Chicharrón de Harina Nuevo León    60        Esquina
## 1928                           Pastelillos Nuevo León    60        Esquina
## 1929                 Concentrados en Polvo Nuevo León    60        Esquina
## 1930                             Cajetilla Nuevo León    60        Esquina
## 1931                 Concentrados en Polvo Nuevo León    60        Esquina
## 1932                             Chocolate Nuevo León    60        Esquina
## 1933                              Rellenas Nuevo León    60        Esquina
## 1934                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1935                      Jugos y Néctares Nuevo León    60        Esquina
## 1936             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1937                     Aguas Saborizadas Nuevo León    60        Esquina
## 1938                            Lavandería Nuevo León    60        Esquina
## 1939                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1940                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1941                          Papas Fritas Nuevo León    60        Esquina
## 1942                           Pastelillos Nuevo León    60        Esquina
## 1943             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1944                          Papas Fritas Nuevo León    60        Esquina
## 1945                              Frituras Nuevo León    60        Esquina
## 1946                              Frituras Nuevo León    60        Esquina
## 1947                          Papas Fritas Nuevo León    60        Esquina
## 1948                          Papas Fritas Nuevo León    60        Esquina
## 1949             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1950                             Pastillas Nuevo León    60        Esquina
## 1951                  Postres Refrigerados Nuevo León    60        Esquina
## 1952                           Pastelillos Nuevo León    60        Esquina
## 1953                 Refrescos Retornables Nuevo León    60        Esquina
## 1954             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1955                                Nachos Nuevo León    60        Esquina
## 1956             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1957                          Papas Fritas Nuevo León    60        Esquina
## 1958             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1959                             Cajetilla Nuevo León    60        Esquina
## 1960                                 Aguas Nuevo León    60        Esquina
## 1961                 Refrescos Retornables Nuevo León    60        Esquina
## 1962                            Cacahuates Nuevo León    60        Esquina
## 1963                            Cacahuates Nuevo León    60        Esquina
## 1964                              Frituras Nuevo León    60        Esquina
## 1965                            Cacahuates Nuevo León    60        Esquina
## 1966                              Frituras Nuevo León    60        Esquina
## 1967                              Frituras Nuevo León    60        Esquina
## 1968                          Papas Fritas Nuevo León    60        Esquina
## 1969             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1970            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1971             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1972                      Leche Saborizada Nuevo León    60        Esquina
## 1973                  Postres Refrigerados Nuevo León    60        Esquina
## 1974                             Chiclosos Nuevo León    60        Esquina
## 1975                  Postres Refrigerados Nuevo León    60        Esquina
## 1976             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1977                            Malvavisco Nuevo León    60        Esquina
## 1978                 Pan de Barra Integral Nuevo León    60        Esquina
## 1979                                 Leche Nuevo León    60        Esquina
## 1980             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1981                               Mazapán Nuevo León    60        Esquina
## 1982                      Leche Saborizada Nuevo León    60        Esquina
## 1983                                Yogurt Nuevo León    60        Esquina
## 1984                          Papas Fritas Nuevo León    60        Esquina
## 1985            Energizantes e Hidratantes Nuevo León    60        Esquina
## 1986                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 1987                             Cajetilla Nuevo León    60        Esquina
## 1988                      Leche Saborizada Nuevo León    60        Esquina
## 1989                  Postres Refrigerados Nuevo León    60        Esquina
## 1990                      Leche Saborizada Nuevo León    60        Esquina
## 1991                                 Aguas Nuevo León    60        Esquina
## 1992             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 1993                 Refrescos Retornables Nuevo León    60        Esquina
## 1994               Productos sin Categoria Nuevo León    60        Esquina
## 1995                                 Leche Nuevo León    60        Esquina
## 1996                            Chocolates Nuevo León    60        Esquina
## 1997             Aromatizantes de Ambiente Nuevo León    60        Esquina
## 1998                             Cajetilla Nuevo León    60        Esquina
## 1999                              Rellenas Nuevo León    60        Esquina
## 2000            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2001                      Leche Saborizada Nuevo León    60        Esquina
## 2002                      Jugos y Néctares Nuevo León    60        Esquina
## 2003                             Cajetilla Nuevo León    60        Esquina
## 2004                 Refrescos Retornables Nuevo León    60        Esquina
## 2005                            Chocolates Nuevo León    60        Esquina
## 2006                   Pan de Barra Blanco Nuevo León    60        Esquina
## 2007                                 Leche Nuevo León    60        Esquina
## 2008                                Azúcar Nuevo León    60        Esquina
## 2009                              Frituras Nuevo León    60        Esquina
## 2010                 Refrescos Retornables Nuevo León    60        Esquina
## 2011                 Refrescos Retornables Nuevo León    60        Esquina
## 2012             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2013             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2014                              Frituras Nuevo León    60        Esquina
## 2015                          Papas Fritas Nuevo León    60        Esquina
## 2016                                Azúcar Nuevo León    60        Esquina
## 2017             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2018             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2019                            Lavandería Nuevo León    60        Esquina
## 2020                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2021                            Lavandería Nuevo León    60        Esquina
## 2022                                Azúcar Nuevo León    60        Esquina
## 2023             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2024                 Refrescos Retornables Nuevo León    60        Esquina
## 2025             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2026                 Refrescos Retornables Nuevo León    60        Esquina
## 2027             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2028                          Papas Fritas Nuevo León    60        Esquina
## 2029                                 Leche Nuevo León    60        Esquina
## 2030                               Surtido Nuevo León    60        Esquina
## 2031                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2032                                 Leche Nuevo León    60        Esquina
## 2033             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2034                             Populares Nuevo León    60        Esquina
## 2035                            Malvavisco Nuevo León    60        Esquina
## 2036                                 Leche Nuevo León    60        Esquina
## 2037             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2038                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2039             Palomitas para Microondas Nuevo León    60        Esquina
## 2040                             Palomitas Nuevo León    60        Esquina
## 2041                                Yogurt Nuevo León    60        Esquina
## 2042             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2043                 Refrescos Retornables Nuevo León    60        Esquina
## 2044                                  Lata Nuevo León    60        Esquina
## 2045                              Frituras Nuevo León    60        Esquina
## 2046             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2047                     Aguas Saborizadas Nuevo León    60        Esquina
## 2048             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2049                 Refrescos Retornables Nuevo León    60        Esquina
## 2050                      Jugos y Néctares Nuevo León    60        Esquina
## 2051                       Papel Higiénico Nuevo León    60        Esquina
## 2052                                 Aguas Nuevo León    60        Esquina
## 2053               Productos sin Categoria Nuevo León    60        Esquina
## 2054             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2055             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2056            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2057                      Leche Saborizada Nuevo León    60        Esquina
## 2058                      Leche Saborizada Nuevo León    60        Esquina
## 2059                                 Leche Nuevo León    60        Esquina
## 2060             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2061                 Refrescos Retornables Nuevo León    60        Esquina
## 2062                 Refrescos Retornables Nuevo León    60        Esquina
## 2063                 Refrescos Retornables Nuevo León    60        Esquina
## 2064             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2065             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2066                         Desodorantes  Nuevo León    60        Esquina
## 2067                             Chocolate Nuevo León    60        Esquina
## 2068                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2069             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2070                 Concentrados en Polvo Nuevo León    60        Esquina
## 2071             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2072                  Postres Refrigerados Nuevo León    60        Esquina
## 2073             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2074                             Cajetilla Nuevo León    60        Esquina
## 2075             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2076                 Refrescos Retornables Nuevo León    60        Esquina
## 2077                            Azucarados Nuevo León    60        Esquina
## 2078                 Refrescos Retornables Nuevo León    60        Esquina
## 2079                      Leche Saborizada Nuevo León    60        Esquina
## 2080                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2081                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2082                           Pastelillos Nuevo León    60        Esquina
## 2083             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2084             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2085                             Cajetilla Nuevo León    60        Esquina
## 2086                 Refrescos Retornables Nuevo León    60        Esquina
## 2087                 Refrescos Retornables Nuevo León    60        Esquina
## 2088                 Concentrados en Polvo Nuevo León    60        Esquina
## 2089             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2090             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2091                 Refrescos Retornables Nuevo León    60        Esquina
## 2092             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2093                                 Aguas Nuevo León    60        Esquina
## 2094                                 Leche Nuevo León    60        Esquina
## 2095                 Refrescos Retornables Nuevo León    60        Esquina
## 2096                 Refrescos Retornables Nuevo León    60        Esquina
## 2097                             Cajetilla Nuevo León    60        Esquina
## 2098                                 Leche Nuevo León    60        Esquina
## 2099                                 Aguas Nuevo León    60        Esquina
## 2100             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2101                  Postres Refrigerados Nuevo León    60        Esquina
## 2102                            Lavandería Nuevo León    60        Esquina
## 2103             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2104                               Surtido Nuevo León    60        Esquina
## 2105            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2106             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2107                      Higiene Femenina Nuevo León    60        Esquina
## 2108             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2109                 Refrescos Retornables Nuevo León    60        Esquina
## 2110             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2111                                 Leche Nuevo León    60        Esquina
## 2112                              Sandwich Nuevo León    60        Esquina
## 2113             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2114                      Jugos y Néctares Nuevo León    60        Esquina
## 2115             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2116             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2117                 Refrescos Retornables Nuevo León    60        Esquina
## 2118                              Cerillos Nuevo León    60        Esquina
## 2119                   Blanqueador de Ropa Nuevo León    60        Esquina
## 2120                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2121                            Lavandería Nuevo León    60        Esquina
## 2122                            Lavandería Nuevo León    60        Esquina
## 2123                 Concentrados en Polvo Nuevo León    60        Esquina
## 2124                      Jugos y Néctares Nuevo León    60        Esquina
## 2125                 Concentrados en Polvo Nuevo León    60        Esquina
## 2126            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2127                      Leche Saborizada Nuevo León    60        Esquina
## 2128                           Lavatrastes Nuevo León    60        Esquina
## 2129                           Sazonadores Nuevo León    60        Esquina
## 2130             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2131                              Frituras Nuevo León    60        Esquina
## 2132                  Chicharrón de Harina Nuevo León    60        Esquina
## 2133                                 Leche Nuevo León    60        Esquina
## 2134                                Cremas Nuevo León    60        Esquina
## 2135             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2136             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2137             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2138                              Frituras Nuevo León    60        Esquina
## 2139                 Refrescos Retornables Nuevo León    60        Esquina
## 2140                 Refrescos Retornables Nuevo León    60        Esquina
## 2141                      Frijoles en Lata Nuevo León    60        Esquina
## 2142                 Refrescos Retornables Nuevo León    60        Esquina
## 2143             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2144                 Refrescos Retornables Nuevo León    60        Esquina
## 2145                            Chocolates Nuevo León    60        Esquina
## 2146                              Sandwich Nuevo León    60        Esquina
## 2147                      Leche Saborizada Nuevo León    60        Esquina
## 2148                      Leche Saborizada Nuevo León    60        Esquina
## 2149             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2150                 Refrescos Retornables Nuevo León    60        Esquina
## 2151                              Sandwich Nuevo León    60        Esquina
## 2152                                Yogurt Nuevo León    60        Esquina
## 2153                 Concentrados en Polvo Nuevo León    60        Esquina
## 2154                            Lavandería Nuevo León    60        Esquina
## 2155                            Lavandería Nuevo León    60        Esquina
## 2156                               Vinagre Nuevo León    60        Esquina
## 2157                              Frituras Nuevo León    60        Esquina
## 2158                          Papas Fritas Nuevo León    60        Esquina
## 2159                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2160                           Pastelillos Nuevo León    60        Esquina
## 2161             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2162                               Consome Nuevo León    60        Esquina
## 2163                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2164                             Cajetilla Nuevo León    60        Esquina
## 2165                                 Leche Nuevo León    60        Esquina
## 2166                                  Lata Nuevo León    60        Esquina
## 2167                            Lavandería Nuevo León    60        Esquina
## 2168                                Yogurt Nuevo León    60        Esquina
## 2169             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2170                            Lavandería Nuevo León    60        Esquina
## 2171             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2172                 Refrescos Retornables Nuevo León    60        Esquina
## 2173                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2174                          Papas Fritas Nuevo León    60        Esquina
## 2175                            Lavandería Nuevo León    60        Esquina
## 2176               Productos sin Categoria Nuevo León    60        Esquina
## 2177                 Refrescos Retornables Nuevo León    60        Esquina
## 2178             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2179            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2180                                 Leche Nuevo León    60        Esquina
## 2181             Palomitas para Microondas Nuevo León    60        Esquina
## 2182                            Lavandería Nuevo León    60        Esquina
## 2183                              Frituras Nuevo León    60        Esquina
## 2184                 Refrescos Retornables Nuevo León    60        Esquina
## 2185                               Consome Nuevo León    60        Esquina
## 2186                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2187                 Refrescos Retornables Nuevo León    60        Esquina
## 2188                 Refrescos Retornables Nuevo León    60        Esquina
## 2189             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2190                            Chocolates Nuevo León    60        Esquina
## 2191                            Lavandería Nuevo León    60        Esquina
## 2192             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2193                                 Leche Nuevo León    60        Esquina
## 2194                      Jugos y Néctares Nuevo León    60        Esquina
## 2195                    Polvo para Hornear Nuevo León    60        Esquina
## 2196                                  Café Nuevo León    60        Esquina
## 2197             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2198             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2199                                 Leche Nuevo León    60        Esquina
## 2200                         Frijol Varios Nuevo León    60        Esquina
## 2201             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2202                 Afeitado y Depilación Nuevo León    60        Esquina
## 2203               Productos sin Categoria Nuevo León    60        Esquina
## 2204             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2205             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2206                              Frituras Nuevo León    60        Esquina
## 2207                              Frituras Nuevo León    60        Esquina
## 2208                 Refrescos Retornables Nuevo León    60        Esquina
## 2209                 Refrescos Retornables Nuevo León    60        Esquina
## 2210             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2211                   Blanqueador de Ropa Nuevo León    60        Esquina
## 2212                                Quesos Nuevo León    60        Esquina
## 2213                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2214             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2215             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2216                 Refrescos Retornables Nuevo León    60        Esquina
## 2217                       Platos y Vasos  Nuevo León    60        Esquina
## 2218             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2219             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2220             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2221                       Platos y Vasos  Nuevo León    60        Esquina
## 2222            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2223             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2224                 Refrescos Retornables Nuevo León    60        Esquina
## 2225                 Refrescos Retornables Nuevo León    60        Esquina
## 2226                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2227                                 Aguas Nuevo León    60        Esquina
## 2228                                Quesos Nuevo León    60        Esquina
## 2229                          Papas Fritas Nuevo León    60        Esquina
## 2230                              Frituras Nuevo León    60        Esquina
## 2231                              Frituras Nuevo León    60        Esquina
## 2232         Fideos, Spaguetti, Tallarines Nuevo León    60        Esquina
## 2233                              Frituras Nuevo León    60        Esquina
## 2234             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2235                      Frijoles en Lata Nuevo León    60        Esquina
## 2236                 Refrescos Retornables Nuevo León    60        Esquina
## 2237             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2238                      Jugos y Néctares Nuevo León    60        Esquina
## 2239                              Cerillos Nuevo León    60        Esquina
## 2240                 Refrescos Retornables Nuevo León    60        Esquina
## 2241                 Refrescos Retornables Nuevo León    60        Esquina
## 2242                              Frituras Nuevo León    60        Esquina
## 2243                          Papas Fritas Nuevo León    60        Esquina
## 2244             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2245             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2246                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2247                            Lavandería Nuevo León    60        Esquina
## 2248             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2249             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2250                       Papel Higiénico Nuevo León    60        Esquina
## 2251                 Refrescos Retornables Nuevo León    60        Esquina
## 2252                 Refrescos Retornables Nuevo León    60        Esquina
## 2253                    Comida para Perros Nuevo León    60        Esquina
## 2254                              Cerillos Nuevo León    60        Esquina
## 2255                  Verduras y Vegetales Nuevo León    60        Esquina
## 2256                 Refrescos Retornables Nuevo León    60        Esquina
## 2257                 Refrescos Retornables Nuevo León    60        Esquina
## 2258                    Comida para Perros Nuevo León    60        Esquina
## 2259               Productos sin Categoria Nuevo León    60        Esquina
## 2260                  Postres Refrigerados Nuevo León    60        Esquina
## 2261                                Nachos Nuevo León    60        Esquina
## 2262                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2263                                Azúcar Nuevo León    60        Esquina
## 2264                    Sopas Instantáneas Nuevo León    60        Esquina
## 2265             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2266                      Frijoles en Lata Nuevo León    60        Esquina
## 2267                                   Sal Nuevo León    60        Esquina
## 2268                                  Mole Nuevo León    60        Esquina
## 2269                               Consome Nuevo León    60        Esquina
## 2270                            Chocolates Nuevo León    60        Esquina
## 2271                       Platos y Vasos  Nuevo León    60        Esquina
## 2272                 Refrescos Retornables Nuevo León    60        Esquina
## 2273             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2274                       Papel Higiénico Nuevo León    60        Esquina
## 2275                 Refrescos Retornables Nuevo León    60        Esquina
## 2276                      Leche Saborizada Nuevo León    60        Esquina
## 2277                  Verduras y Vegetales Nuevo León    60        Esquina
## 2278                                Quesos Nuevo León    60        Esquina
## 2279                                 Leche Nuevo León    60        Esquina
## 2280             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2281             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2282                               Saladas Nuevo León    60        Esquina
## 2283                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2284             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2285                 Refrescos Retornables Nuevo León    60        Esquina
## 2286                             Cajetilla Nuevo León    60        Esquina
## 2287             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2288                   Blanqueador de Ropa Nuevo León    60        Esquina
## 2289               Productos sin Categoria Nuevo León    60        Esquina
## 2290             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2291                              Frituras Nuevo León    60        Esquina
## 2292                              Frituras Nuevo León    60        Esquina
## 2293                 Refrescos Retornables Nuevo León    60        Esquina
## 2294                 Refrescos Retornables Nuevo León    60        Esquina
## 2295             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2296                     Aguas Saborizadas Nuevo León    60        Esquina
## 2297             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2298                       Platos y Vasos  Nuevo León    60        Esquina
## 2299                       Platos y Vasos  Nuevo León    60        Esquina
## 2300                   Blanqueador de Ropa Nuevo León    60        Esquina
## 2301                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2302                     Aguas Saborizadas Nuevo León    60        Esquina
## 2303                                Cremas Nuevo León    60        Esquina
## 2304 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 2305                 Refrescos Retornables Nuevo León    60        Esquina
## 2306                 Refrescos Retornables Nuevo León    60        Esquina
## 2307                         Sal Combinada Nuevo León    60        Esquina
## 2308                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2309                             Cajetilla Nuevo León    60        Esquina
## 2310                          Pasta Dental Nuevo León    60        Esquina
## 2311             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2312                         Tradicionales Nuevo León    60        Esquina
## 2313                 Refrescos Retornables Nuevo León    60        Esquina
## 2314                          Papas Fritas Nuevo León    60        Esquina
## 2315                              Frituras Nuevo León    60        Esquina
## 2316                      Leche Saborizada Nuevo León    60        Esquina
## 2317                              Sandwich Nuevo León    60        Esquina
## 2318                               Surtido Nuevo León    60        Esquina
## 2319                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2320                              Tostadas Nuevo León    60        Esquina
## 2321                                 Aguas Nuevo León    60        Esquina
## 2322                 Refrescos Retornables Nuevo León    60        Esquina
## 2323                           Frijol Bayo Nuevo León    60        Esquina
## 2324                    Sopas Instantáneas Nuevo León    60        Esquina
## 2325            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2326                      Jugos y Néctares Nuevo León    60        Esquina
## 2327                 Concentrados en Polvo Nuevo León    60        Esquina
## 2328             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2329             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2330            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2331                   Pan de Barra Blanco Nuevo León    60        Esquina
## 2332             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2333                    Comida para Perros Nuevo León    60        Esquina
## 2334                    Sopas Instantáneas Nuevo León    60        Esquina
## 2335                               Surtido Nuevo León    60        Esquina
## 2336                       Fruta Acidulada Nuevo León    60        Esquina
## 2337                          Papas Fritas Nuevo León    60        Esquina
## 2338                      Jugos y Néctares Nuevo León    60        Esquina
## 2339             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2340                      Jugos y Néctares Nuevo León    60        Esquina
## 2341             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2342                       Platos y Vasos  Nuevo León    60        Esquina
## 2343                       Platos y Vasos  Nuevo León    60        Esquina
## 2344                              Frituras Nuevo León    60        Esquina
## 2345                              Frituras Nuevo León    60        Esquina
## 2346             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2347             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2348                                 Aguas Nuevo León    60        Esquina
## 2349                 Refrescos Retornables Nuevo León    60        Esquina
## 2350             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2351                                Cremas Nuevo León    60        Esquina
## 2352             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2353                         Salsa Picante Nuevo León    60        Esquina
## 2354             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2355                             Chocolate Nuevo León    60        Esquina
## 2356            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2357                            Chocolates Nuevo León    60        Esquina
## 2358                              Frituras Nuevo León    60        Esquina
## 2359             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2360                       Papel Higiénico Nuevo León    60        Esquina
## 2361                 Refrescos Retornables Nuevo León    60        Esquina
## 2362                          Papas Fritas Nuevo León    60        Esquina
## 2363                                 Leche Nuevo León    60        Esquina
## 2364                              Frituras Nuevo León    60        Esquina
## 2365                              Frituras Nuevo León    60        Esquina
## 2366                          Papas Fritas Nuevo León    60        Esquina
## 2367             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2368                                  Lata Nuevo León    60        Esquina
## 2369                 Concentrados en Polvo Nuevo León    60        Esquina
## 2370             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2371             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2372                          Papas Fritas Nuevo León    60        Esquina
## 2373                      Jugos y Néctares Nuevo León    60        Esquina
## 2374                                 Leche Nuevo León    60        Esquina
## 2375                                Yogurt Nuevo León    60        Esquina
## 2376                                Cremas Nuevo León    60        Esquina
## 2377                              Frituras Nuevo León    60        Esquina
## 2378             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2379             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2380            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2381                          Papas Fritas Nuevo León    60        Esquina
## 2382             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2383               Productos sin Categoria Nuevo León    60        Esquina
## 2384                            Lavandería Nuevo León    60        Esquina
## 2385                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2386                               Surtido Nuevo León    60        Esquina
## 2387                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2388                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2389                             Populares Nuevo León    60        Esquina
## 2390               Productos sin Categoria Nuevo León    60        Esquina
## 2391             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2392                             Cajetilla Nuevo León    60        Esquina
## 2393                      Jugos y Néctares Nuevo León    60        Esquina
## 2394                             Cajetilla Nuevo León    60        Esquina
## 2395                          Papas Fritas Nuevo León    60        Esquina
## 2396                 Refrescos Retornables Nuevo León    60        Esquina
## 2397             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2398             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2399                    Sopas Instantáneas Nuevo León    60        Esquina
## 2400                    Sopas Instantáneas Nuevo León    60        Esquina
## 2401                           Pastelillos Nuevo León    60        Esquina
## 2402                             Cajetilla Nuevo León    60        Esquina
## 2403             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2404                          Papas Fritas Nuevo León    60        Esquina
## 2405                              Frituras Nuevo León    60        Esquina
## 2406                      Frijoles en Lata Nuevo León    60        Esquina
## 2407            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2408                               Mostaza Nuevo León    60        Esquina
## 2409                 Refrescos Retornables Nuevo León    60        Esquina
## 2410                               Surtido Nuevo León    60        Esquina
## 2411                               Surtido Nuevo León    60        Esquina
## 2412             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2413                              Frituras Nuevo León    60        Esquina
## 2414                    Sopas Instantáneas Nuevo León    60        Esquina
## 2415                 Refrescos Retornables Nuevo León    60        Esquina
## 2416                              Frituras Nuevo León    60        Esquina
## 2417                              Frituras Nuevo León    60        Esquina
## 2418                              Frituras Nuevo León    60        Esquina
## 2419                              Frituras Nuevo León    60        Esquina
## 2420                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2421                                 Leche Nuevo León    60        Esquina
## 2422                 Refrescos Retornables Nuevo León    60        Esquina
## 2423                       Fruta Acidulada Nuevo León    60        Esquina
## 2424                       Gomas de Mazcar Nuevo León    60        Esquina
## 2425             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2426                              Frituras Nuevo León    60        Esquina
## 2427             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2428                           Servilletas Nuevo León    60        Esquina
## 2429                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2430                                 Leche Nuevo León    60        Esquina
## 2431             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2432             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2433             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2434             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2435                 Concentrados en Polvo Nuevo León    60        Esquina
## 2436                          Puré de Papa Nuevo León    60        Esquina
## 2437                             Chocolate Nuevo León    60        Esquina
## 2438                       Gomas de Mazcar Nuevo León    60        Esquina
## 2439                 Refrescos Retornables Nuevo León    60        Esquina
## 2440                 Concentrados en Polvo Nuevo León    60        Esquina
## 2441               Productos sin Categoria Nuevo León    60        Esquina
## 2442                              Frituras Nuevo León    60        Esquina
## 2443                                Quesos Nuevo León    60        Esquina
## 2444                            Cacahuates Nuevo León    60        Esquina
## 2445                              Frituras Nuevo León    60        Esquina
## 2446                    Polvo para Hornear Nuevo León    60        Esquina
## 2447             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2448                            Malvavisco Nuevo León    60        Esquina
## 2449                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2450                      Leche Saborizada Nuevo León    60        Esquina
## 2451                                Yogurt Nuevo León    60        Esquina
## 2452                          Pasta Dental Nuevo León    60        Esquina
## 2453                         Desodorantes  Nuevo León    60        Esquina
## 2454               Productos sin Categoria Nuevo León    60        Esquina
## 2455             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2456                 Concentrados en Polvo Nuevo León    60        Esquina
## 2457                       Platos y Vasos  Nuevo León    60        Esquina
## 2458                       Platos y Vasos  Nuevo León    60        Esquina
## 2459                 Concentrados en Polvo Nuevo León    60        Esquina
## 2460             Palomitas para Microondas Nuevo León    60        Esquina
## 2461                          Papas Fritas Nuevo León    60        Esquina
## 2462                                Cremas Nuevo León    60        Esquina
## 2463            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2464                           Empanizador Nuevo León    60        Esquina
## 2465                                  Lata Nuevo León    60        Esquina
## 2466                             Cajetilla Nuevo León    60        Esquina
## 2467                      Leche Saborizada Nuevo León    60        Esquina
## 2468                               Surtido Nuevo León    60        Esquina
## 2469             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2470                       Papel Higiénico Nuevo León    60        Esquina
## 2471             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2472                              Frituras Nuevo León    60        Esquina
## 2473                                 Arroz Nuevo León    60        Esquina
## 2474                                Azúcar Nuevo León    60        Esquina
## 2475                              Frituras Nuevo León    60        Esquina
## 2476                             Chocolate Nuevo León    60        Esquina
## 2477                          Papas Fritas Nuevo León    60        Esquina
## 2478                          Papas Fritas Nuevo León    60        Esquina
## 2479                 Refrescos Retornables Nuevo León    60        Esquina
## 2480                                 Leche Nuevo León    60        Esquina
## 2481                            Cacahuates Nuevo León    60        Esquina
## 2482             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2483             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2484                                 Leche Nuevo León    60        Esquina
## 2485                    Sopas Instantáneas Nuevo León    60        Esquina
## 2486                            Malvavisco Nuevo León    60        Esquina
## 2487                            Azucarados Nuevo León    60        Esquina
## 2488                                 Leche Nuevo León    60        Esquina
## 2489                    Sopas Instantáneas Nuevo León    60        Esquina
## 2490                     Aguas Saborizadas Nuevo León    60        Esquina
## 2491                             Cajetilla Nuevo León    60        Esquina
## 2492                              Frituras Nuevo León    60        Esquina
## 2493                 Refrescos Retornables Nuevo León    60        Esquina
## 2494                        Salsa Botanera Nuevo León    60        Esquina
## 2495             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2496                      Jugos y Néctares Nuevo León    60        Esquina
## 2497                    Barras Energéticas Nuevo León    60        Esquina
## 2498                                 Leche Nuevo León    60        Esquina
## 2499                    Cuidado de la Piel Nuevo León    60        Esquina
## 2500                                 Leche Nuevo León    60        Esquina
## 2501             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2502                                 Leche Nuevo León    60        Esquina
## 2503                      Jugos y Néctares Nuevo León    60        Esquina
## 2504             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2505             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2506             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2507                       Fruta Acidulada Nuevo León    60        Esquina
## 2508                          Papas Fritas Nuevo León    60        Esquina
## 2509                          Papas Fritas Nuevo León    60        Esquina
## 2510                    Sopas Instantáneas Nuevo León    60        Esquina
## 2511                            Cacahuates Nuevo León    60        Esquina
## 2512                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 2513             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2514                               Surtido Nuevo León    60        Esquina
## 2515             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2516                 Concentrados en Polvo Nuevo León    60        Esquina
## 2517               Productos sin Categoria Nuevo León    60        Esquina
## 2518               Productos sin Categoria Nuevo León    60        Esquina
## 2519                 Refrescos Retornables Nuevo León    60        Esquina
## 2520                                 Leche Nuevo León    60        Esquina
## 2521                 Refrescos Retornables Nuevo León    60        Esquina
## 2522                                 Leche Nuevo León    60        Esquina
## 2523                             Cajetilla Nuevo León    60        Esquina
## 2524             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2525             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2526             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2527            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2528             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2529             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2530             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2531                 Pan de Barra Integral Nuevo León    60        Esquina
## 2532                             Cajetilla Nuevo León    60        Esquina
## 2533                 Refrescos Retornables Nuevo León    60        Esquina
## 2534               Productos sin Categoria Nuevo León    60        Esquina
## 2535                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2536                              Papillas Nuevo León    60        Esquina
## 2537                                  Lata Nuevo León    60        Esquina
## 2538            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2539                      Leche Saborizada Nuevo León    60        Esquina
## 2540             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2541             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2542             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2543             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2544             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2545                              Frituras Nuevo León    60        Esquina
## 2546             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2547                              Frituras Nuevo León    60        Esquina
## 2548                      Jugos y Néctares Nuevo León    60        Esquina
## 2549                          Papas Fritas Nuevo León    60        Esquina
## 2550                 Concentrados en Polvo Nuevo León    60        Esquina
## 2551                                Cremas Nuevo León    60        Esquina
## 2552                 Concentrados en Polvo Nuevo León    60        Esquina
## 2553             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2554                              Frituras Nuevo León    60        Esquina
## 2555                              Frituras Nuevo León    60        Esquina
## 2556                             Chocolate Nuevo León    60        Esquina
## 2557                      Leche Saborizada Nuevo León    60        Esquina
## 2558             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2559                                  Lata Nuevo León    60        Esquina
## 2560             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2561                              Frituras Nuevo León    60        Esquina
## 2562                    Barras Energéticas Nuevo León    60        Esquina
## 2563             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2564                            Lavandería Nuevo León    60        Esquina
## 2565                   Blanqueador de Ropa Nuevo León    60        Esquina
## 2566                             Cajetilla Nuevo León    60        Esquina
## 2567                            Lavandería Nuevo León    60        Esquina
## 2568                               Consome Nuevo León    60        Esquina
## 2569                           Lavatrastes Nuevo León    60        Esquina
## 2570             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2571                                 Leche Nuevo León    60        Esquina
## 2572                 Refrescos Retornables Nuevo León    60        Esquina
## 2573                            Chocolates Nuevo León    60        Esquina
## 2574                         Salsa Picante Nuevo León    60        Esquina
## 2575             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2576                 Refrescos Retornables Nuevo León    60        Esquina
## 2577                  Verduras y Vegetales Nuevo León    60        Esquina
## 2578                                  Atún Nuevo León    60        Esquina
## 2579                      Jugos y Néctares Nuevo León    60        Esquina
## 2580                             Cajetilla Nuevo León    60        Esquina
## 2581                         Tradicionales Nuevo León    60        Esquina
## 2582                      Leche Saborizada Nuevo León    60        Esquina
## 2583                          Papas Fritas Nuevo León    60        Esquina
## 2584                              Frituras Nuevo León    60        Esquina
## 2585             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2586                               Saladas Nuevo León    60        Esquina
## 2587                 Concentrados en Polvo Nuevo León    60        Esquina
## 2588                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2589                           Lavatrastes Nuevo León    60        Esquina
## 2590                     Aguas Saborizadas Nuevo León    60        Esquina
## 2591                                 Aguas Nuevo León    60        Esquina
## 2592                             Chocolate Nuevo León    60        Esquina
## 2593                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2594                      Jugos y Néctares Nuevo León    60        Esquina
## 2595                        Cepillo Dental Nuevo León    60        Esquina
## 2596                 Refrescos Retornables Nuevo León    60        Esquina
## 2597                 Refrescos Retornables Nuevo León    60        Esquina
## 2598                                 Aguas Nuevo León    60        Esquina
## 2599                     Aguas Saborizadas Nuevo León    60        Esquina
## 2600            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2601            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2602               Productos sin Categoria Nuevo León    60        Esquina
## 2603             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2604                               Consome Nuevo León    60        Esquina
## 2605                 Concentrados en Polvo Nuevo León    60        Esquina
## 2606                            Lavandería Nuevo León    60        Esquina
## 2607                      Frijoles en Lata Nuevo León    60        Esquina
## 2608                                Cremas Nuevo León    60        Esquina
## 2609                      Leche Saborizada Nuevo León    60        Esquina
## 2610                           Pastelillos Nuevo León    60        Esquina
## 2611                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2612                      Jugos y Néctares Nuevo León    60        Esquina
## 2613             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2614                              Frituras Nuevo León    60        Esquina
## 2615                              Frituras Nuevo León    60        Esquina
## 2616                   Cuidado del Cabello Nuevo León    60        Esquina
## 2617                      Jugos y Néctares Nuevo León    60        Esquina
## 2618                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2619                                Tocino Nuevo León    60        Esquina
## 2620                           Sazonadores Nuevo León    60        Esquina
## 2621                       Platos y Vasos  Nuevo León    60        Esquina
## 2622                                Cremas Nuevo León    60        Esquina
## 2623                   Pan de Barra Blanco Nuevo León    60        Esquina
## 2624             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2625            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2626             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2627             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2628                           Lavatrastes Nuevo León    60        Esquina
## 2629                 Concentrados en Polvo Nuevo León    60        Esquina
## 2630                 Concentrados en Polvo Nuevo León    60        Esquina
## 2631             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2632             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2633                       Platos y Vasos  Nuevo León    60        Esquina
## 2634                       Platos y Vasos  Nuevo León    60        Esquina
## 2635             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2636                 Refrescos Retornables Nuevo León    60        Esquina
## 2637             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2638                            Chocolates Nuevo León    60        Esquina
## 2639                          Papas Fritas Nuevo León    60        Esquina
## 2640                     Aguas Saborizadas Nuevo León    60        Esquina
## 2641             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2642             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2643                 Concentrados en Polvo Nuevo León    60        Esquina
## 2644             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2645             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2646                 Refrescos Retornables Nuevo León    60        Esquina
## 2647                      Frijoles en Lata Nuevo León    60        Esquina
## 2648                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2649                           Pastelillos Nuevo León    60        Esquina
## 2650                              Cerillos Nuevo León    60        Esquina
## 2651                 Concentrados en Polvo Nuevo León    60        Esquina
## 2652                 Refrescos Retornables Nuevo León    60        Esquina
## 2653             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2654                            Lavandería Nuevo León    60        Esquina
## 2655                   Blanqueador de Ropa Nuevo León    60        Esquina
## 2656                    Sopas Instantáneas Nuevo León    60        Esquina
## 2657             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2658         Fideos, Spaguetti, Tallarines Nuevo León    60        Esquina
## 2659                    Sopas Instantáneas Nuevo León    60        Esquina
## 2660             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2661                        Salsa Botanera Nuevo León    60        Esquina
## 2662                            Lavandería Nuevo León    60        Esquina
## 2663 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 2664                                Catsup Nuevo León    60        Esquina
## 2665             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2666                 Refrescos Retornables Nuevo León    60        Esquina
## 2667                             Cajetilla Nuevo León    60        Esquina
## 2668             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2669             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2670                 Refrescos Retornables Nuevo León    60        Esquina
## 2671                         Frijol Varios Nuevo León    60        Esquina
## 2672                         Salsa Picante Nuevo León    60        Esquina
## 2673                              Frituras Nuevo León    60        Esquina
## 2674                                 Arroz Nuevo León    60        Esquina
## 2675             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2676                                 Arroz Nuevo León    60        Esquina
## 2677            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2678             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2679            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2680                  Postres Refrigerados Nuevo León    60        Esquina
## 2681             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2682             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2683 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 2684                           Empanizador Nuevo León    60        Esquina
## 2685                  Postres Refrigerados Nuevo León    60        Esquina
## 2686                       Leches y Cremas Nuevo León    60        Esquina
## 2687                 Concentrados en Polvo Nuevo León    60        Esquina
## 2688                           Empanizador Nuevo León    60        Esquina
## 2689                             Cajetilla Nuevo León    60        Esquina
## 2690                                  Café Nuevo León    60        Esquina
## 2691             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2692                                Yogurt Nuevo León    60        Esquina
## 2693                           Empanizador Nuevo León    60        Esquina
## 2694                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2695                      Chiles Envasados Nuevo León    60        Esquina
## 2696                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2697                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2698            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2699                              Frituras Nuevo León    60        Esquina
## 2700                   Blanqueador de Ropa Nuevo León    60        Esquina
## 2701             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2702                                 Arroz Nuevo León    60        Esquina
## 2703                                  Mole Nuevo León    60        Esquina
## 2704                 Refrescos Retornables Nuevo León    60        Esquina
## 2705                              Frituras Nuevo León    60        Esquina
## 2706             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2707             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2708                 Refrescos Retornables Nuevo León    60        Esquina
## 2709                          Papas Fritas Nuevo León    60        Esquina
## 2710                       Platos y Vasos  Nuevo León    60        Esquina
## 2711                       Platos y Vasos  Nuevo León    60        Esquina
## 2712             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2713                             Cajetilla Nuevo León    60        Esquina
## 2714                             Cajetilla Nuevo León    60        Esquina
## 2715                  Verduras y Vegetales Nuevo León    60        Esquina
## 2716                 Refrescos Retornables Nuevo León    60        Esquina
## 2717                              Frituras Nuevo León    60        Esquina
## 2718                              Frituras Nuevo León    60        Esquina
## 2719                      Jugos y Néctares Nuevo León    60        Esquina
## 2720                                 Arroz Nuevo León    60        Esquina
## 2721                          Papas Fritas Nuevo León    60        Esquina
## 2722                               Saladas Nuevo León    60        Esquina
## 2723             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2724                           Sazonadores Nuevo León    60        Esquina
## 2725                              Frituras Nuevo León    60        Esquina
## 2726                Insecticidas y Venenos Nuevo León    60        Esquina
## 2727             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2728             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2729                       Fruta Acidulada Nuevo León    60        Esquina
## 2730                    Cuidado de la Piel Nuevo León    60        Esquina
## 2731                      Higiene Femenina Nuevo León    60        Esquina
## 2732                       Papel Higiénico Nuevo León    60        Esquina
## 2733                   Blanqueador de Ropa Nuevo León    60        Esquina
## 2734                   Pan de Barra Blanco Nuevo León    60        Esquina
## 2735                         Jamón de Pavo Nuevo León    60        Esquina
## 2736                           Pastelillos Nuevo León    60        Esquina
## 2737                                Quesos Nuevo León    60        Esquina
## 2738                              Frituras Nuevo León    60        Esquina
## 2739                 Refrescos Retornables Nuevo León    60        Esquina
## 2740             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2741             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2742                         Frijol Varios Nuevo León    60        Esquina
## 2743                              Tostadas Nuevo León    60        Esquina
## 2744                              Frituras Nuevo León    60        Esquina
## 2745             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2746                             Cajetilla Nuevo León    60        Esquina
## 2747                 Refrescos Retornables Nuevo León    60        Esquina
## 2748                          Papas Fritas Nuevo León    60        Esquina
## 2749                         Salsa Picante Nuevo León    60        Esquina
## 2750             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2751             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2752                 Concentrados en Polvo Nuevo León    60        Esquina
## 2753            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2754                 Concentrados en Polvo Nuevo León    60        Esquina
## 2755                 Concentrados en Polvo Nuevo León    60        Esquina
## 2756                                   Sal Nuevo León    60        Esquina
## 2757                               Saladas Nuevo León    60        Esquina
## 2758                                 Aguas Nuevo León    60        Esquina
## 2759                     Aguas Saborizadas Nuevo León    60        Esquina
## 2760                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2761             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2762             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2763                 Refrescos Retornables Nuevo León    60        Esquina
## 2764                      Higiene Femenina Nuevo León    60        Esquina
## 2765                      Jugos y Néctares Nuevo León    60        Esquina
## 2766                 Refrescos Retornables Nuevo León    60        Esquina
## 2767                        Salsa Botanera Nuevo León    60        Esquina
## 2768                             Mayonesa  Nuevo León    60        Esquina
## 2769             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2770             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2771                          Papas Fritas Nuevo León    60        Esquina
## 2772                             Cajetilla Nuevo León    60        Esquina
## 2773                                Cremas Nuevo León    60        Esquina
## 2774                       Leches y Cremas Nuevo León    60        Esquina
## 2775             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2776                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2777                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2778             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2779             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2780                 Refrescos Retornables Nuevo León    60        Esquina
## 2781             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2782             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2783                           Empanizador Nuevo León    60        Esquina
## 2784            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2785             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2786 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 2787                             Cajetilla Nuevo León    60        Esquina
## 2788                              Frituras Nuevo León    60        Esquina
## 2789                              Frituras Nuevo León    60        Esquina
## 2790                      Leche Saborizada Nuevo León    60        Esquina
## 2791                 Refrescos Retornables Nuevo León    60        Esquina
## 2792                  Limpiadores Líquidos Nuevo León    60        Esquina
## 2793                           Lavatrastes Nuevo León    60        Esquina
## 2794                             Cajetilla Nuevo León    60        Esquina
## 2795             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2796                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2797             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2798                       Platos y Vasos  Nuevo León    60        Esquina
## 2799             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2800                 Refrescos Retornables Nuevo León    60        Esquina
## 2801             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2802                  Postres Refrigerados Nuevo León    60        Esquina
## 2803                                 Aguas Nuevo León    60        Esquina
## 2804             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2805                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2806                      Jugos y Néctares Nuevo León    60        Esquina
## 2807                 Refrescos Retornables Nuevo León    60        Esquina
## 2808                 Refrescos Retornables Nuevo León    60        Esquina
## 2809             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2810                 Refrescos Retornables Nuevo León    60        Esquina
## 2811                         Jamón de Pavo Nuevo León    60        Esquina
## 2812                 Refrescos Retornables Nuevo León    60        Esquina
## 2813                 Refrescos Retornables Nuevo León    60        Esquina
## 2814                           Pastelillos Nuevo León    60        Esquina
## 2815                                 Aguas Nuevo León    60        Esquina
## 2816             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2817                                  Lata Nuevo León    60        Esquina
## 2818             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2819             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2820                                Cremas Nuevo León    60        Esquina
## 2821                         Tradicionales Nuevo León    60        Esquina
## 2822                  Postres Refrigerados Nuevo León    60        Esquina
## 2823                                 Aguas Nuevo León    60        Esquina
## 2824                                 Leche Nuevo León    60        Esquina
## 2825                              Frituras Nuevo León    60        Esquina
## 2826                   Pan de Barra Blanco Nuevo León    60        Esquina
## 2827                                 Leche Nuevo León    60        Esquina
## 2828             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2829             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2830             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2831                        Jamón de Cerdo Nuevo León    60        Esquina
## 2832                 Refrescos Retornables Nuevo León    60        Esquina
## 2833               Productos sin Categoria Nuevo León    60        Esquina
## 2834                      Chiles Envasados Nuevo León    60        Esquina
## 2835             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2836                         Frijol Varios Nuevo León    60        Esquina
## 2837                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2838             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2839                              Tostadas Nuevo León    60        Esquina
## 2840                 Refrescos Retornables Nuevo León    60        Esquina
## 2841                         Sal Combinada Nuevo León    60        Esquina
## 2842                                Quesos Nuevo León    60        Esquina
## 2843                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2844                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2845                              Frituras Nuevo León    60        Esquina
## 2846                 Refrescos Retornables Nuevo León    60        Esquina
## 2847                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2848              Salchicha HotDog y Viena Nuevo León    60        Esquina
## 2849             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2850             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2851                      Frijoles en Lata Nuevo León    60        Esquina
## 2852             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2853             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2854             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2855                 Refrescos Retornables Nuevo León    60        Esquina
## 2856             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2857                 Refrescos Retornables Nuevo León    60        Esquina
## 2858                              Cerillos Nuevo León    60        Esquina
## 2859                 Refrescos Retornables Nuevo León    60        Esquina
## 2860                 Refrescos Retornables Nuevo León    60        Esquina
## 2861             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2862             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2863                      Jugos y Néctares Nuevo León    60        Esquina
## 2864             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2865             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2866             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2867                    Cuidado de la Piel Nuevo León    60        Esquina
## 2868             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2869               Productos sin Categoria Nuevo León    60        Esquina
## 2870                       Gomas de Mazcar Nuevo León    60        Esquina
## 2871                               Saladas Nuevo León    60        Esquina
## 2872                      Chiles Envasados Nuevo León    60        Esquina
## 2873                                Cremas Nuevo León    60        Esquina
## 2874             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2875                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2876             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2877                               Surtido Nuevo León    60        Esquina
## 2878             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2879                             Cajetilla Nuevo León    60        Esquina
## 2880      Tortillas de Harina e Integrales Nuevo León    60        Esquina
## 2881                        Leche en Polvo Nuevo León    60        Esquina
## 2882                              Frituras Nuevo León    60        Esquina
## 2883                              Frituras Nuevo León    60        Esquina
## 2884                              Frituras Nuevo León    60        Esquina
## 2885             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2886                 Refrescos Retornables Nuevo León    60        Esquina
## 2887                            Cacahuates Nuevo León    60        Esquina
## 2888                                 Leche Nuevo León    60        Esquina
## 2889                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2890            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2891                       Platos y Vasos  Nuevo León    60        Esquina
## 2892                       Platos y Vasos  Nuevo León    60        Esquina
## 2893                               Saladas Nuevo León    60        Esquina
## 2894                              Frituras Nuevo León    60        Esquina
## 2895                      Jugos y Néctares Nuevo León    60        Esquina
## 2896                           Pastelillos Nuevo León    60        Esquina
## 2897             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2898                             Cajetilla Nuevo León    60        Esquina
## 2899             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2900             Palomitas para Microondas Nuevo León    60        Esquina
## 2901                               Saladas Nuevo León    60        Esquina
## 2902                            Malvavisco Nuevo León    60        Esquina
## 2903             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2904                              Frituras Nuevo León    60        Esquina
## 2905                              Frituras Nuevo León    60        Esquina
## 2906             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2907                            Chocolates Nuevo León    60        Esquina
## 2908               Productos sin Categoria Nuevo León    60        Esquina
## 2909             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2910                              Frituras Nuevo León    60        Esquina
## 2911                              Frituras Nuevo León    60        Esquina
## 2912                      Jugos y Néctares Nuevo León    60        Esquina
## 2913                              Frituras Nuevo León    60        Esquina
## 2914                              Frituras Nuevo León    60        Esquina
## 2915                              Frituras Nuevo León    60        Esquina
## 2916                      Jugos y Néctares Nuevo León    60        Esquina
## 2917                                 Arroz Nuevo León    60        Esquina
## 2918                              Tostadas Nuevo León    60        Esquina
## 2919                          Papas Fritas Nuevo León    60        Esquina
## 2920                         Tradicionales Nuevo León    60        Esquina
## 2921                              Frituras Nuevo León    60        Esquina
## 2922             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2923                      Jugos y Néctares Nuevo León    60        Esquina
## 2924                              Frituras Nuevo León    60        Esquina
## 2925             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2926                 Concentrados en Polvo Nuevo León    60        Esquina
## 2927                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2928                              Cerillos Nuevo León    60        Esquina
## 2929                                 Aguas Nuevo León    60        Esquina
## 2930             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2931             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2932                    Sopas Instantáneas Nuevo León    60        Esquina
## 2933                              Frituras Nuevo León    60        Esquina
## 2934                              Semillas Nuevo León    60        Esquina
## 2935             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2936                      Frijoles en Lata Nuevo León    60        Esquina
## 2937                 Concentrados en Polvo Nuevo León    60        Esquina
## 2938                 Concentrados en Polvo Nuevo León    60        Esquina
## 2939                 Concentrados en Polvo Nuevo León    60        Esquina
## 2940                             Cajetilla Nuevo León    60        Esquina
## 2941             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2942                             Cajetilla Nuevo León    60        Esquina
## 2943                 Refrescos Retornables Nuevo León    60        Esquina
## 2944             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2945             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2946             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2947                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2948                             Cajetilla Nuevo León    60        Esquina
## 2949             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2950                                 Leche Nuevo León    60        Esquina
## 2951                             Chocolate Nuevo León    60        Esquina
## 2952                       Cremas de Nieve Nuevo León    60        Esquina
## 2953                              Frituras Nuevo León    60        Esquina
## 2954                                Yogurt Nuevo León    60        Esquina
## 2955                                Yogurt Nuevo León    60        Esquina
## 2956             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2957                              Frituras Nuevo León    60        Esquina
## 2958                  Salsa para Spaguetti Nuevo León    60        Esquina
## 2959             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2960                              Frituras Nuevo León    60        Esquina
## 2961             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2962                               Surtido Nuevo León    60        Esquina
## 2963                  Postres Refrigerados Nuevo León    60        Esquina
## 2964                                Yogurt Nuevo León    60        Esquina
## 2965                              Frituras Nuevo León    60        Esquina
## 2966                 Refrescos Retornables Nuevo León    60        Esquina
## 2967                              Frituras Nuevo León    60        Esquina
## 2968                                Yogurt Nuevo León    60        Esquina
## 2969                         Salsa Picante Nuevo León    60        Esquina
## 2970             Palomitas para Microondas Nuevo León    60        Esquina
## 2971                              Frituras Nuevo León    60        Esquina
## 2972                  Chicharrón de Harina Nuevo León    60        Esquina
## 2973                   Cuidado del Cabello Nuevo León    60        Esquina
## 2974             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2975                                 Leche Nuevo León    60        Esquina
## 2976                   Salchicha para Asar Nuevo León    60        Esquina
## 2977                                 Aguas Nuevo León    60        Esquina
## 2978             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2979             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2980                 Concentrados en Polvo Nuevo León    60        Esquina
## 2981                  Postres Refrigerados Nuevo León    60        Esquina
## 2982                  Postres Refrigerados Nuevo León    60        Esquina
## 2983                          Dulce Macizo Nuevo León    60        Esquina
## 2984             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2985                  Postres Refrigerados Nuevo León    60        Esquina
## 2986                 Refrescos Retornables Nuevo León    60        Esquina
## 2987                             Palomitas Nuevo León    60        Esquina
## 2988                 Refrescos Retornables Nuevo León    60        Esquina
## 2989             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 2990                              Frituras Nuevo León    60        Esquina
## 2991            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2992                              Rellenas Nuevo León    60        Esquina
## 2993                                Yogurt Nuevo León    60        Esquina
## 2994                             Cajetilla Nuevo León    60        Esquina
## 2995                                Quesos Nuevo León    60        Esquina
## 2996                      Frijoles en Lata Nuevo León    60        Esquina
## 2997            Energizantes e Hidratantes Nuevo León    60        Esquina
## 2998                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 2999                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3000                                 Leche Nuevo León    60        Esquina
## 3001             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3002                            Lavandería Nuevo León    60        Esquina
## 3003                      Higiene Femenina Nuevo León    60        Esquina
## 3004                 Refrescos Retornables Nuevo León    60        Esquina
## 3005                              Frituras Nuevo León    60        Esquina
## 3006                          Papas Fritas Nuevo León    60        Esquina
## 3007                                 Leche Nuevo León    60        Esquina
## 3008                                 Arroz Nuevo León    60        Esquina
## 3009             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3010               Productos sin Categoria Nuevo León    60        Esquina
## 3011                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3012                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3013             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3014                                  Lata Nuevo León    60        Esquina
## 3015 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 3016                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3017                          Papas Fritas Nuevo León    60        Esquina
## 3018                 Refrescos Retornables Nuevo León    60        Esquina
## 3019                 Refrescos Retornables Nuevo León    60        Esquina
## 3020                                Yogurt Nuevo León    60        Esquina
## 3021             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3022                                Yogurt Nuevo León    60        Esquina
## 3023                                  Atún Nuevo León    60        Esquina
## 3024                             Cajetilla Nuevo León    60        Esquina
## 3025            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3026                             Cajetilla Nuevo León    60        Esquina
## 3027                                 Leche Nuevo León    60        Esquina
## 3028                           Pastelillos Nuevo León    60        Esquina
## 3029                 Refrescos Retornables Nuevo León    60        Esquina
## 3030                 Refrescos Retornables Nuevo León    60        Esquina
## 3031                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3032                             Cajetilla Nuevo León    60        Esquina
## 3033                             Pastillas Nuevo León    60        Esquina
## 3034                 Refrescos Retornables Nuevo León    60        Esquina
## 3035                                 Leche Nuevo León    60        Esquina
## 3036                      Chiles Envasados Nuevo León    60        Esquina
## 3037               Productos sin Categoria Nuevo León    60        Esquina
## 3038             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3039             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3040             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3041             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3042                                 Aguas Nuevo León    60        Esquina
## 3043                           Lavatrastes Nuevo León    60        Esquina
## 3044             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3045                             Cajetilla Nuevo León    60        Esquina
## 3046             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3047                 Concentrados en Polvo Nuevo León    60        Esquina
## 3048                                 Arroz Nuevo León    60        Esquina
## 3049                                Varios Nuevo León    60        Esquina
## 3050                                   Sal Nuevo León    60        Esquina
## 3051                              Frituras Nuevo León    60        Esquina
## 3052                               Paletas Nuevo León    60        Esquina
## 3053             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3054             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3055                      Frijoles en Lata Nuevo León    60        Esquina
## 3056            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3057                             Cajetilla Nuevo León    60        Esquina
## 3058                                 Aguas Nuevo León    60        Esquina
## 3059                              Frituras Nuevo León    60        Esquina
## 3060                              Frituras Nuevo León    60        Esquina
## 3061                                  Lata Nuevo León    60        Esquina
## 3062            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3063             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3064               Productos sin Categoria Nuevo León    60        Esquina
## 3065                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3066               Productos sin Categoria Nuevo León    60        Esquina
## 3067                 Refrescos Retornables Nuevo León    60        Esquina
## 3068                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3069                             Cajetilla Nuevo León    60        Esquina
## 3070                              Frituras Nuevo León    60        Esquina
## 3071                                 Arroz Nuevo León    60        Esquina
## 3072                 Refrescos Retornables Nuevo León    60        Esquina
## 3073                                 Leche Nuevo León    60        Esquina
## 3074             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3075                                 Leche Nuevo León    60        Esquina
## 3076             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3077                                 Leche Nuevo León    60        Esquina
## 3078             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3079                 Refrescos Retornables Nuevo León    60        Esquina
## 3080                               Paletas Nuevo León    60        Esquina
## 3081                              Frituras Nuevo León    60        Esquina
## 3082                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3083                          Papas Fritas Nuevo León    60        Esquina
## 3084                              Sandwich Nuevo León    60        Esquina
## 3085                 Refrescos Retornables Nuevo León    60        Esquina
## 3086               Productos sin Categoria Nuevo León    60        Esquina
## 3087                          Papas Fritas Nuevo León    60        Esquina
## 3088                              Frituras Nuevo León    60        Esquina
## 3089                          Papas Fritas Nuevo León    60        Esquina
## 3090             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3091                                Nachos Nuevo León    60        Esquina
## 3092                 Refrescos Retornables Nuevo León    60        Esquina
## 3093                 Refrescos Retornables Nuevo León    60        Esquina
## 3094                 Refrescos Retornables Nuevo León    60        Esquina
## 3095            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3096                       Gomas de Mazcar Nuevo León    60        Esquina
## 3097                 Refrescos Retornables Nuevo León    60        Esquina
## 3098                   Pan de Barra Blanco Nuevo León    60        Esquina
## 3099                      Jugos y Néctares Nuevo León    60        Esquina
## 3100                                 Leche Nuevo León    60        Esquina
## 3101                 Refrescos Retornables Nuevo León    60        Esquina
## 3102                               Saladas Nuevo León    60        Esquina
## 3103                              Frituras Nuevo León    60        Esquina
## 3104                             Cajetilla Nuevo León    60        Esquina
## 3105                 Afeitado y Depilación Nuevo León    60        Esquina
## 3106                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3107                      Jugos y Néctares Nuevo León    60        Esquina
## 3108                          Papas Fritas Nuevo León    60        Esquina
## 3109                          Papas Fritas Nuevo León    60        Esquina
## 3110                          Papas Fritas Nuevo León    60        Esquina
## 3111                          Papas Fritas Nuevo León    60        Esquina
## 3112                          Papas Fritas Nuevo León    60        Esquina
## 3113                    Sopas Instantáneas Nuevo León    60        Esquina
## 3114             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3115                               Paletas Nuevo León    60        Esquina
## 3116             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3117                       Cremas de Nieve Nuevo León    60        Esquina
## 3118                      Leche Saborizada Nuevo León    60        Esquina
## 3119                             Cajetilla Nuevo León    60        Esquina
## 3120                              Sandwich Nuevo León    60        Esquina
## 3121                             Cajetilla Nuevo León    60        Esquina
## 3122                             Cajetilla Nuevo León    60        Esquina
## 3123                 Refrescos Retornables Nuevo León    60        Esquina
## 3124                              Frituras Nuevo León    60        Esquina
## 3125             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3126                              Semillas Nuevo León    60        Esquina
## 3127             Palomitas para Microondas Nuevo León    60        Esquina
## 3128                 Concentrados en Polvo Nuevo León    60        Esquina
## 3129                              Frituras Nuevo León    60        Esquina
## 3130                                 Leche Nuevo León    60        Esquina
## 3131                             Cajetilla Nuevo León    60        Esquina
## 3132                           Pastelillos Nuevo León    60        Esquina
## 3133                          Papas Fritas Nuevo León    60        Esquina
## 3134                             Chocolate Nuevo León    60        Esquina
## 3135                              Sandwich Nuevo León    60        Esquina
## 3136                              Frituras Nuevo León    60        Esquina
## 3137                              Frituras Nuevo León    60        Esquina
## 3138                              Frituras Nuevo León    60        Esquina
## 3139                                 Leche Nuevo León    60        Esquina
## 3140             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3141             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3142                      Leche Saborizada Nuevo León    60        Esquina
## 3143                 Refrescos Retornables Nuevo León    60        Esquina
## 3144                                 Aguas Nuevo León    60        Esquina
## 3145                  Chicharrón de Harina Nuevo León    60        Esquina
## 3146                             Cajetilla Nuevo León    60        Esquina
## 3147                                Nachos Nuevo León    60        Esquina
## 3148                              Frituras Nuevo León    60        Esquina
## 3149                              Frituras Nuevo León    60        Esquina
## 3150               Productos sin Categoria Nuevo León    60        Esquina
## 3151             Palomitas para Microondas Nuevo León    60        Esquina
## 3152                          Papas Fritas Nuevo León    60        Esquina
## 3153                  Chicharrón de Harina Nuevo León    60        Esquina
## 3154                                 Leche Nuevo León    60        Esquina
## 3155                        Leche en Polvo Nuevo León    60        Esquina
## 3156               Productos sin Categoria Nuevo León    60        Esquina
## 3157                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3158                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3159                             Pastillas Nuevo León    60        Esquina
## 3160             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3161                   Pan de Barra Blanco Nuevo León    60        Esquina
## 3162             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3163                 Concentrados en Polvo Nuevo León    60        Esquina
## 3164                 Refrescos Retornables Nuevo León    60        Esquina
## 3165             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3166                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3167                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3168             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3169                           Pastelillos Nuevo León    60        Esquina
## 3170             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3171                    Cuidado de la Piel Nuevo León    60        Esquina
## 3172                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3173                     Aguas Saborizadas Nuevo León    60        Esquina
## 3174                               Mazapán Nuevo León    60        Esquina
## 3175                    Cuidado de la Piel Nuevo León    60        Esquina
## 3176                       Platos y Vasos  Nuevo León    60        Esquina
## 3177             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3178             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3179                                Yogurt Nuevo León    60        Esquina
## 3180                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3181                                Yogurt Nuevo León    60        Esquina
## 3182                 Refrescos Retornables Nuevo León    60        Esquina
## 3183            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3184             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3185                             Chocolate Nuevo León    60        Esquina
## 3186                      Leche Saborizada Nuevo León    60        Esquina
## 3187             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3188                                 Leche Nuevo León    60        Esquina
## 3189                 Refrescos Retornables Nuevo León    60        Esquina
## 3190                             Cajetilla Nuevo León    60        Esquina
## 3191             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3192                                 Aguas Nuevo León    60        Esquina
## 3193                  Chicharrón de Harina Nuevo León    60        Esquina
## 3194             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3195                              Papillas Nuevo León    60        Esquina
## 3196             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3197                                 Aguas Nuevo León    60        Esquina
## 3198             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3199             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3200               Productos sin Categoria Nuevo León    60        Esquina
## 3201             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3202                                Azúcar Nuevo León    60        Esquina
## 3203                  Limpiadores Líquidos Nuevo León    60        Esquina
## 3204             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3205                   Blanqueador de Ropa Nuevo León    60        Esquina
## 3206                             Cajetilla Nuevo León    60        Esquina
## 3207             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3208                                 Leche Nuevo León    60        Esquina
## 3209             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3210             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3211                 Refrescos Retornables Nuevo León    60        Esquina
## 3212                 Refrescos Retornables Nuevo León    60        Esquina
## 3213                                 Leche Nuevo León    60        Esquina
## 3214                           Pastelillos Nuevo León    60        Esquina
## 3215                               Consome Nuevo León    60        Esquina
## 3216                 Concentrados en Polvo Nuevo León    60        Esquina
## 3217                 Refrescos Retornables Nuevo León    60        Esquina
## 3218                           Pastelillos Nuevo León    60        Esquina
## 3219             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3220                         Salsa Picante Nuevo León    60        Esquina
## 3221                            Lavandería Nuevo León    60        Esquina
## 3222             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3223                     Aguas Saborizadas Nuevo León    60        Esquina
## 3224             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3225             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3226             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3227                               Consome Nuevo León    60        Esquina
## 3228                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3229                 Refrescos Retornables Nuevo León    60        Esquina
## 3230                     Aguas Saborizadas Nuevo León    60        Esquina
## 3231                              Frituras Nuevo León    60        Esquina
## 3232                                Yogurt Nuevo León    60        Esquina
## 3233             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3234               Productos sin Categoria Nuevo León    60        Esquina
## 3235                                  Mole Nuevo León    60        Esquina
## 3236                 Refrescos Retornables Nuevo León    60        Esquina
## 3237                                 Aguas Nuevo León    60        Esquina
## 3238                              Frituras Nuevo León    60        Esquina
## 3239             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3240                 Refrescos Retornables Nuevo León    60        Esquina
## 3241                              Sandwich Nuevo León    60        Esquina
## 3242                            Malvavisco Nuevo León    60        Esquina
## 3243                                  Mole Nuevo León    60        Esquina
## 3244             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3245                 Concentrados en Polvo Nuevo León    60        Esquina
## 3246                                  Atún Nuevo León    60        Esquina
## 3247                                 Arroz Nuevo León    60        Esquina
## 3248                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3249                           Lavatrastes Nuevo León    60        Esquina
## 3250                                Azúcar Nuevo León    60        Esquina
## 3251                  Salsa para Spaguetti Nuevo León    60        Esquina
## 3252                                Cremas Nuevo León    60        Esquina
## 3253                      Jugos y Néctares Nuevo León    60        Esquina
## 3254             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3255                           Pastelillos Nuevo León    60        Esquina
## 3256             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3257             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3258                            Lavandería Nuevo León    60        Esquina
## 3259               Productos sin Categoria Nuevo León    60        Esquina
## 3260                                 Leche Nuevo León    60        Esquina
## 3261                 Refrescos Retornables Nuevo León    60        Esquina
## 3262                               Saladas Nuevo León    60        Esquina
## 3263                      Jugos y Néctares Nuevo León    60        Esquina
## 3264                      Jugos y Néctares Nuevo León    60        Esquina
## 3265                 Concentrados en Polvo Nuevo León    60        Esquina
## 3266                          Papas Fritas Nuevo León    60        Esquina
## 3267                                Yogurt Nuevo León    60        Esquina
## 3268                    Sopas Instantáneas Nuevo León    60        Esquina
## 3269             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3270                            Lavandería Nuevo León    60        Esquina
## 3271                          Papas Fritas Nuevo León    60        Esquina
## 3272                              Frituras Nuevo León    60        Esquina
## 3273                              Frituras Nuevo León    60        Esquina
## 3274             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3275                            Lavandería Nuevo León    60        Esquina
## 3276             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3277                 Refrescos Retornables Nuevo León    60        Esquina
## 3278                              Frituras Nuevo León    60        Esquina
## 3279                          Papas Fritas Nuevo León    60        Esquina
## 3280                 Concentrados en Polvo Nuevo León    60        Esquina
## 3281                 Refrescos Retornables Nuevo León    60        Esquina
## 3282                 Concentrados en Polvo Nuevo León    60        Esquina
## 3283                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3284             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3285                 Refrescos Retornables Nuevo León    60        Esquina
## 3286                           Lavatrastes Nuevo León    60        Esquina
## 3287                              Frituras Nuevo León    60        Esquina
## 3288             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3289             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3290                              Tostadas Nuevo León    60        Esquina
## 3291                 Refrescos Retornables Nuevo León    60        Esquina
## 3292                 Refrescos Retornables Nuevo León    60        Esquina
## 3293             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3294                           Pastelillos Nuevo León    60        Esquina
## 3295                                 Aguas Nuevo León    60        Esquina
## 3296                          Papas Fritas Nuevo León    60        Esquina
## 3297             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3298                 Refrescos Retornables Nuevo León    60        Esquina
## 3299                                 Leche Nuevo León    60        Esquina
## 3300                               Consome Nuevo León    60        Esquina
## 3301                                Yogurt Nuevo León    60        Esquina
## 3302                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3303                      Leche Saborizada Nuevo León    60        Esquina
## 3304                    Barras Energéticas Nuevo León    60        Esquina
## 3305            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3306             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3307                              Sandwich Nuevo León    60        Esquina
## 3308                              Frituras Nuevo León    60        Esquina
## 3309             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3310                              Papillas Nuevo León    60        Esquina
## 3311                  Limpiadores Líquidos Nuevo León    60        Esquina
## 3312             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3313                               Consome Nuevo León    60        Esquina
## 3314                      Jugos y Néctares Nuevo León    60        Esquina
## 3315                      Jugos y Néctares Nuevo León    60        Esquina
## 3316                  Postres Refrigerados Nuevo León    60        Esquina
## 3317             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3318                  Limpiadores Líquidos Nuevo León    60        Esquina
## 3319                            Lavandería Nuevo León    60        Esquina
## 3320             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3321                              Frituras Nuevo León    60        Esquina
## 3322                               Consome Nuevo León    60        Esquina
## 3323                 Refrescos Retornables Nuevo León    60        Esquina
## 3324                               Saladas Nuevo León    60        Esquina
## 3325             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3326             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3327                              Frituras Nuevo León    60        Esquina
## 3328                              Frituras Nuevo León    60        Esquina
## 3329             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3330                          Papas Fritas Nuevo León    60        Esquina
## 3331                                 Leche Nuevo León    60        Esquina
## 3332             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3333                    Sopas Instantáneas Nuevo León    60        Esquina
## 3334                 Concentrados en Polvo Nuevo León    60        Esquina
## 3335                   Blanqueador de Ropa Nuevo León    60        Esquina
## 3336 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 3337                              Frituras Nuevo León    60        Esquina
## 3338                 Refrescos Retornables Nuevo León    60        Esquina
## 3339                                 Leche Nuevo León    60        Esquina
## 3340             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3341                    Sopas Instantáneas Nuevo León    60        Esquina
## 3342             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3343             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3344                         Jamón de Pavo Nuevo León    60        Esquina
## 3345                                Cremas Nuevo León    60        Esquina
## 3346                                 Leche Nuevo León    60        Esquina
## 3347                         Jamón de Pavo Nuevo León    60        Esquina
## 3348            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3349             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3350                                Cremas Nuevo León    60        Esquina
## 3351            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3352                            Chocolates Nuevo León    60        Esquina
## 3353               Productos sin Categoria Nuevo León    60        Esquina
## 3354             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3355             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3356             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3357                 Concentrados en Polvo Nuevo León    60        Esquina
## 3358                                   Sal Nuevo León    60        Esquina
## 3359                 Refrescos Retornables Nuevo León    60        Esquina
## 3360             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3361                             Cajetilla Nuevo León    60        Esquina
## 3362                      Frijoles en Lata Nuevo León    60        Esquina
## 3363                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3364                               Saladas Nuevo León    60        Esquina
## 3365                              Frituras Nuevo León    60        Esquina
## 3366                        Cepillo Dental Nuevo León    60        Esquina
## 3367                            Cacahuates Nuevo León    60        Esquina
## 3368                 Refrescos Retornables Nuevo León    60        Esquina
## 3369                               Paletas Nuevo León    60        Esquina
## 3370                 Refrescos Retornables Nuevo León    60        Esquina
## 3371                           Maíz Rocero Nuevo León    60        Esquina
## 3372                              Tostadas Nuevo León    60        Esquina
## 3373                             Cajetilla Nuevo León    60        Esquina
## 3374             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3375                           Servilletas Nuevo León    60        Esquina
## 3376                                 Arroz Nuevo León    60        Esquina
## 3377                     Aguas Saborizadas Nuevo León    60        Esquina
## 3378                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3379                      Leche Saborizada Nuevo León    60        Esquina
## 3380                    Comida para Perros Nuevo León    60        Esquina
## 3381                           Pastelillos Nuevo León    60        Esquina
## 3382             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3383                                Yogurt Nuevo León    60        Esquina
## 3384                               Paletas Nuevo León    60        Esquina
## 3385                 Refrescos Retornables Nuevo León    60        Esquina
## 3386                            Lavandería Nuevo León    60        Esquina
## 3387                              Frituras Nuevo León    60        Esquina
## 3388                 Refrescos Retornables Nuevo León    60        Esquina
## 3389                      Jugos y Néctares Nuevo León    60        Esquina
## 3390                 Afeitado y Depilación Nuevo León    60        Esquina
## 3391                 Refrescos Retornables Nuevo León    60        Esquina
## 3392                              Frituras Nuevo León    60        Esquina
## 3393             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3394                              Frituras Nuevo León    60        Esquina
## 3395                 Refrescos Retornables Nuevo León    60        Esquina
## 3396                                 Aguas Nuevo León    60        Esquina
## 3397             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3398                              Frituras Nuevo León    60        Esquina
## 3399                    Barras Energéticas Nuevo León    60        Esquina
## 3400                     Aguas Saborizadas Nuevo León    60        Esquina
## 3401                            Azucarados Nuevo León    60        Esquina
## 3402                                 Leche Nuevo León    60        Esquina
## 3403             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3404                         Jamón de Pavo Nuevo León    60        Esquina
## 3405             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3406             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3407                 Refrescos Retornables Nuevo León    60        Esquina
## 3408                  Postres Refrigerados Nuevo León    60        Esquina
## 3409                 Refrescos Retornables Nuevo León    60        Esquina
## 3410             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3411                      Jugos y Néctares Nuevo León    60        Esquina
## 3412                              Frituras Nuevo León    60        Esquina
## 3413             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3414             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3415                 Refrescos Retornables Nuevo León    60        Esquina
## 3416                            Chocolates Nuevo León    60        Esquina
## 3417             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3418             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3419                    Barras Energéticas Nuevo León    60        Esquina
## 3420                                Quesos Nuevo León    60        Esquina
## 3421             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3422                 Refrescos Retornables Nuevo León    60        Esquina
## 3423                 Refrescos Retornables Nuevo León    60        Esquina
## 3424                            Lavandería Nuevo León    60        Esquina
## 3425                      Jugos y Néctares Nuevo León    60        Esquina
## 3426             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3427             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3428                                Catsup Nuevo León    60        Esquina
## 3429                          Papas Fritas Nuevo León    60        Esquina
## 3430                                Yogurt Nuevo León    60        Esquina
## 3431             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3432                   Blanqueador de Ropa Nuevo León    60        Esquina
## 3433                             Chocolate Nuevo León    60        Esquina
## 3434                      Leche Saborizada Nuevo León    60        Esquina
## 3435                           Pastelillos Nuevo León    60        Esquina
## 3436             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3437                 Refrescos Retornables Nuevo León    60        Esquina
## 3438             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3439             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3440                           Pastelillos Nuevo León    60        Esquina
## 3441             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3442                    Sopas Instantáneas Nuevo León    60        Esquina
## 3443                            Lavandería Nuevo León    60        Esquina
## 3444                                Yogurt Nuevo León    60        Esquina
## 3445                 Refrescos Retornables Nuevo León    60        Esquina
## 3446                                Azúcar Nuevo León    60        Esquina
## 3447             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3448             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3449                         Salsa Picante Nuevo León    60        Esquina
## 3450                                  Mole Nuevo León    60        Esquina
## 3451             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3452             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3453                      Frijoles en Lata Nuevo León    60        Esquina
## 3454                                Cremas Nuevo León    60        Esquina
## 3455                 Refrescos Retornables Nuevo León    60        Esquina
## 3456                 Refrescos Retornables Nuevo León    60        Esquina
## 3457 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 3458                  Chicharrón de Harina Nuevo León    60        Esquina
## 3459                       Platos y Vasos  Nuevo León    60        Esquina
## 3460                          Papas Fritas Nuevo León    60        Esquina
## 3461                              Frituras Nuevo León    60        Esquina
## 3462                                 Aguas Nuevo León    60        Esquina
## 3463               Productos sin Categoria Nuevo León    60        Esquina
## 3464                 Refrescos Retornables Nuevo León    60        Esquina
## 3465             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3466                 Refrescos Retornables Nuevo León    60        Esquina
## 3467                            Lavandería Nuevo León    60        Esquina
## 3468                 Concentrados en Polvo Nuevo León    60        Esquina
## 3469                              Sandwich Nuevo León    60        Esquina
## 3470                            Lavandería Nuevo León    60        Esquina
## 3471             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3472                 Refrescos Retornables Nuevo León    60        Esquina
## 3473                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3474                               Surtido Nuevo León    60        Esquina
## 3475                     Aguas Saborizadas Nuevo León    60        Esquina
## 3476                               Surtido Nuevo León    60        Esquina
## 3477               Productos sin Categoria Nuevo León    60        Esquina
## 3478                            Chocolates Nuevo León    60        Esquina
## 3479             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3480                                  Lata Nuevo León    60        Esquina
## 3481                           Empanizador Nuevo León    60        Esquina
## 3482                                Nachos Nuevo León    60        Esquina
## 3483             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3484                                 Aguas Nuevo León    60        Esquina
## 3485                     Aguas Saborizadas Nuevo León    60        Esquina
## 3486               Productos sin Categoria Nuevo León    60        Esquina
## 3487                            Lavandería Nuevo León    60        Esquina
## 3488                            Lavandería Nuevo León    60        Esquina
## 3489                    Harina para Pastel Nuevo León    60        Esquina
## 3490                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3491                 Refrescos Retornables Nuevo León    60        Esquina
## 3492                               Consome Nuevo León    60        Esquina
## 3493                 Refrescos Retornables Nuevo León    60        Esquina
## 3494                 Refrescos Retornables Nuevo León    60        Esquina
## 3495                               Saladas Nuevo León    60        Esquina
## 3496                                Cremas Nuevo León    60        Esquina
## 3497                 Refrescos Retornables Nuevo León    60        Esquina
## 3498             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3499                      Jugos y Néctares Nuevo León    60        Esquina
## 3500                 Refrescos Retornables Nuevo León    60        Esquina
## 3501                 Concentrados en Polvo Nuevo León    60        Esquina
## 3502                                Catsup Nuevo León    60        Esquina
## 3503                                 Leche Nuevo León    60        Esquina
## 3504             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3505                  Verduras y Vegetales Nuevo León    60        Esquina
## 3506             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3507                                 Leche Nuevo León    60        Esquina
## 3508                            Cacahuates Nuevo León    60        Esquina
## 3509                          Papas Fritas Nuevo León    60        Esquina
## 3510                         Tradicionales Nuevo León    60        Esquina
## 3511                  Limpiadores Líquidos Nuevo León    60        Esquina
## 3512                 Refrescos Retornables Nuevo León    60        Esquina
## 3513                          Papas Fritas Nuevo León    60        Esquina
## 3514                          Papas Fritas Nuevo León    60        Esquina
## 3515                              Frituras Nuevo León    60        Esquina
## 3516                          Papas Fritas Nuevo León    60        Esquina
## 3517                              Frituras Nuevo León    60        Esquina
## 3518                   Blanqueador de Ropa Nuevo León    60        Esquina
## 3519                                Yogurt Nuevo León    60        Esquina
## 3520                              Frituras Nuevo León    60        Esquina
## 3521            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3522                             Cajetilla Nuevo León    60        Esquina
## 3523                 Concentrados en Polvo Nuevo León    60        Esquina
## 3524            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3525                               Surtido Nuevo León    60        Esquina
## 3526                      Jugos y Néctares Nuevo León    60        Esquina
## 3527             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3528                            Lavandería Nuevo León    60        Esquina
## 3529             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3530             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3531                               Saladas Nuevo León    60        Esquina
## 3532                                Quesos Nuevo León    60        Esquina
## 3533                 Refrescos Retornables Nuevo León    60        Esquina
## 3534                  Chicharrón de Harina Nuevo León    60        Esquina
## 3535                              Frituras Nuevo León    60        Esquina
## 3536               Productos sin Categoria Nuevo León    60        Esquina
## 3537                                   Sal Nuevo León    60        Esquina
## 3538                  Limpiadores Líquidos Nuevo León    60        Esquina
## 3539                            Malvavisco Nuevo León    60        Esquina
## 3540                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3541                               Saladas Nuevo León    60        Esquina
## 3542                            Azucarados Nuevo León    60        Esquina
## 3543                         Salsa Picante Nuevo León    60        Esquina
## 3544                            Lavandería Nuevo León    60        Esquina
## 3545                   Pan de Barra Blanco Nuevo León    60        Esquina
## 3546                                Catsup Nuevo León    60        Esquina
## 3547                                 Arroz Nuevo León    60        Esquina
## 3548                 Refrescos Retornables Nuevo León    60        Esquina
## 3549                              Frituras Nuevo León    60        Esquina
## 3550                              Frituras Nuevo León    60        Esquina
## 3551                               Consome Nuevo León    60        Esquina
## 3552             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3553                 Refrescos Retornables Nuevo León    60        Esquina
## 3554             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3555                                 Jugos Nuevo León    60        Esquina
## 3556                 Refrescos Retornables Nuevo León    60        Esquina
## 3557                               Saladas Nuevo León    60        Esquina
## 3558                 Refrescos Retornables Nuevo León    60        Esquina
## 3559                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3560                                Catsup Nuevo León    60        Esquina
## 3561              Salchicha HotDog y Viena Nuevo León    60        Esquina
## 3562 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 3563                 Refrescos Retornables Nuevo León    60        Esquina
## 3564                      Higiene Femenina Nuevo León    60        Esquina
## 3565                     Aguas Saborizadas Nuevo León    60        Esquina
## 3566                         Desodorantes  Nuevo León    60        Esquina
## 3567                     Aguas Saborizadas Nuevo León    60        Esquina
## 3568                           Empanizador Nuevo León    60        Esquina
## 3569                                Quesos Nuevo León    60        Esquina
## 3570                 Refrescos Retornables Nuevo León    60        Esquina
## 3571                  Postres Refrigerados Nuevo León    60        Esquina
## 3572             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3573                                Yogurt Nuevo León    60        Esquina
## 3574             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3575                             Cajetilla Nuevo León    60        Esquina
## 3576                              Sandwich Nuevo León    60        Esquina
## 3577             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3578                      Jugos y Néctares Nuevo León    60        Esquina
## 3579                             Chocolate Nuevo León    60        Esquina
## 3580                  Limpiadores Líquidos Nuevo León    60        Esquina
## 3581                           Lavatrastes Nuevo León    60        Esquina
## 3582                           Pastelillos Nuevo León    60        Esquina
## 3583             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3584                              Sandwich Nuevo León    60        Esquina
## 3585                      Jugos y Néctares Nuevo León    60        Esquina
## 3586                                 Aguas Nuevo León    60        Esquina
## 3587                  Chicharrón de Harina Nuevo León    60        Esquina
## 3588                     Aguas Saborizadas Nuevo León    60        Esquina
## 3589                                 Leche Nuevo León    60        Esquina
## 3590                     Aguas Saborizadas Nuevo León    60        Esquina
## 3591                              Sandwich Nuevo León    60        Esquina
## 3592                               Surtido Nuevo León    60        Esquina
## 3593                 Refrescos Retornables Nuevo León    60        Esquina
## 3594                             Cajetilla Nuevo León    60        Esquina
## 3595                               Saladas Nuevo León    60        Esquina
## 3596                     Aguas Saborizadas Nuevo León    60        Esquina
## 3597                    Sopas Instantáneas Nuevo León    60        Esquina
## 3598                      Jugos y Néctares Nuevo León    60        Esquina
## 3599                              Frituras Nuevo León    60        Esquina
## 3600                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3601                 Refrescos Retornables Nuevo León    60        Esquina
## 3602             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3603                             Cajetilla Nuevo León    60        Esquina
## 3604             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3605                 Refrescos Retornables Nuevo León    60        Esquina
## 3606                           Pastelillos Nuevo León    60        Esquina
## 3607                              Frituras Nuevo León    60        Esquina
## 3608                             Cajetilla Nuevo León    60        Esquina
## 3609                              Frituras Nuevo León    60        Esquina
## 3610                                 Leche Nuevo León    60        Esquina
## 3611                       Platos y Vasos  Nuevo León    60        Esquina
## 3612                 Refrescos Retornables Nuevo León    60        Esquina
## 3613                 Refrescos Retornables Nuevo León    60        Esquina
## 3614                 Refrescos Retornables Nuevo León    60        Esquina
## 3615                           Pastelillos Nuevo León    60        Esquina
## 3616                            Cacahuates Nuevo León    60        Esquina
## 3617                   Blanqueador de Ropa Nuevo León    60        Esquina
## 3618                  Limpiadores Líquidos Nuevo León    60        Esquina
## 3619                              Semillas Nuevo León    60        Esquina
## 3620                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3621                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3622                         Frijol Varios Nuevo León    60        Esquina
## 3623                 Refrescos Retornables Nuevo León    60        Esquina
## 3624                             Mayonesa  Nuevo León    60        Esquina
## 3625                      Frijoles en Lata Nuevo León    60        Esquina
## 3626                 Concentrados en Polvo Nuevo León    60        Esquina
## 3627                 Concentrados en Polvo Nuevo León    60        Esquina
## 3628                  Chicharrón de Harina Nuevo León    60        Esquina
## 3629                              Frituras Nuevo León    60        Esquina
## 3630                              Frituras Nuevo León    60        Esquina
## 3631             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3632                                Cremas Nuevo León    60        Esquina
## 3633                                 Leche Nuevo León    60        Esquina
## 3634             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3635                       Platos y Vasos  Nuevo León    60        Esquina
## 3636                                Quesos Nuevo León    60        Esquina
## 3637                            Chocolates Nuevo León    60        Esquina
## 3638                                Nachos Nuevo León    60        Esquina
## 3639                    Sopas Instantáneas Nuevo León    60        Esquina
## 3640                              Rellenas Nuevo León    60        Esquina
## 3641                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3642                              Frituras Nuevo León    60        Esquina
## 3643             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3644                 Refrescos Retornables Nuevo León    60        Esquina
## 3645                              Frituras Nuevo León    60        Esquina
## 3646                    Sopas Instantáneas Nuevo León    60        Esquina
## 3647                 Refrescos Retornables Nuevo León    60        Esquina
## 3648                     Aguas Saborizadas Nuevo León    60        Esquina
## 3649                            Chocolates Nuevo León    60        Esquina
## 3650             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3651             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3652             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3653             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3654                                  Café Nuevo León    60        Esquina
## 3655             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3656                 Refrescos Retornables Nuevo León    60        Esquina
## 3657                               Consome Nuevo León    60        Esquina
## 3658                                 Arroz Nuevo León    60        Esquina
## 3659               Productos sin Categoria Nuevo León    60        Esquina
## 3660             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3661             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3662                  Limpiadores Líquidos Nuevo León    60        Esquina
## 3663                 Refrescos Retornables Nuevo León    60        Esquina
## 3664             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3665                                 Leche Nuevo León    60        Esquina
## 3666                            Lavandería Nuevo León    60        Esquina
## 3667                              Frituras Nuevo León    60        Esquina
## 3668                    Sopas Instantáneas Nuevo León    60        Esquina
## 3669            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3670                          Papas Fritas Nuevo León    60        Esquina
## 3671             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3672            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3673                 Concentrados en Polvo Nuevo León    60        Esquina
## 3674                 Concentrados en Polvo Nuevo León    60        Esquina
## 3675                                Azúcar Nuevo León    60        Esquina
## 3676                           Lavatrastes Nuevo León    60        Esquina
## 3677             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3678                 Refrescos Retornables Nuevo León    60        Esquina
## 3679                                 Arroz Nuevo León    60        Esquina
## 3680               Productos sin Categoria Nuevo León    60        Esquina
## 3681                 Refrescos Retornables Nuevo León    60        Esquina
## 3682                               Consome Nuevo León    60        Esquina
## 3683                             Mayonesa  Nuevo León    60        Esquina
## 3684                            Lavandería Nuevo León    60        Esquina
## 3685                                Quesos Nuevo León    60        Esquina
## 3686                      Leche Saborizada Nuevo León    60        Esquina
## 3687                                  Mole Nuevo León    60        Esquina
## 3688                            Lavandería Nuevo León    60        Esquina
## 3689                            Lavandería Nuevo León    60        Esquina
## 3690                      Jugos y Néctares Nuevo León    60        Esquina
## 3691             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3692             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3693                                 Leche Nuevo León    60        Esquina
## 3694                 Refrescos Retornables Nuevo León    60        Esquina
## 3695                            Chocolates Nuevo León    60        Esquina
## 3696             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3697                      Jugos y Néctares Nuevo León    60        Esquina
## 3698             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3699             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3700             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3701             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3702             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3703                 Refrescos Retornables Nuevo León    60        Esquina
## 3704                           Frijol Bayo Nuevo León    60        Esquina
## 3705             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3706                                Polvos Nuevo León    60        Esquina
## 3707                              Frituras Nuevo León    60        Esquina
## 3708             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3709                 Refrescos Retornables Nuevo León    60        Esquina
## 3710                 Concentrados en Polvo Nuevo León    60        Esquina
## 3711                  Limpiadores Líquidos Nuevo León    60        Esquina
## 3712                 Refrescos Retornables Nuevo León    60        Esquina
## 3713             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3714                  Salsa para Spaguetti Nuevo León    60        Esquina
## 3715                 Refrescos Retornables Nuevo León    60        Esquina
## 3716      Tortillas de Harina e Integrales Nuevo León    60        Esquina
## 3717                              Frituras Nuevo León    60        Esquina
## 3718                            Chocolates Nuevo León    60        Esquina
## 3719             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3720                 Refrescos Retornables Nuevo León    60        Esquina
## 3721                             Cajetilla Nuevo León    60        Esquina
## 3722                           Pastelillos Nuevo León    60        Esquina
## 3723                            Cacahuates Nuevo León    60        Esquina
## 3724             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3725                              Frituras Nuevo León    60        Esquina
## 3726                           Pastelillos Nuevo León    60        Esquina
## 3727                 Refrescos Retornables Nuevo León    60        Esquina
## 3728                   Pan de Barra Blanco Nuevo León    60        Esquina
## 3729             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3730                                Quesos Nuevo León    60        Esquina
## 3731               Productos sin Categoria Nuevo León    60        Esquina
## 3732                               Surtido Nuevo León    60        Esquina
## 3733                               Surtido Nuevo León    60        Esquina
## 3734             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3735            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3736             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3737                            Malvavisco Nuevo León    60        Esquina
## 3738                             Cajetilla Nuevo León    60        Esquina
## 3739             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3740                                 Aguas Nuevo León    60        Esquina
## 3741            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3742            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3743                             Cajetilla Nuevo León    60        Esquina
## 3744                      Jugos y Néctares Nuevo León    60        Esquina
## 3745                    Sopas Instantáneas Nuevo León    60        Esquina
## 3746             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3747                           Empanizador Nuevo León    60        Esquina
## 3748            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3749             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3750             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3751                   Cuidado del Cabello Nuevo León    60        Esquina
## 3752                              Frituras Nuevo León    60        Esquina
## 3753                     Aguas Saborizadas Nuevo León    60        Esquina
## 3754             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3755                          Papas Fritas Nuevo León    60        Esquina
## 3756                             Mayonesa  Nuevo León    60        Esquina
## 3757                          Papas Fritas Nuevo León    60        Esquina
## 3758             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3759             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3760             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3761                          Papas Fritas Nuevo León    60        Esquina
## 3762                              Frituras Nuevo León    60        Esquina
## 3763                      Frijoles en Lata Nuevo León    60        Esquina
## 3764             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3765                       Platos y Vasos  Nuevo León    60        Esquina
## 3766                            Chocolates Nuevo León    60        Esquina
## 3767                 Refrescos Retornables Nuevo León    60        Esquina
## 3768             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3769             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3770             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3771                          Dulce Macizo Nuevo León    60        Esquina
## 3772                          Papas Fritas Nuevo León    60        Esquina
## 3773                                Quesos Nuevo León    60        Esquina
## 3774               Productos sin Categoria Nuevo León    60        Esquina
## 3775                      Jugos y Néctares Nuevo León    60        Esquina
## 3776                         Tradicionales Nuevo León    60        Esquina
## 3777             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3778                             Cajetilla Nuevo León    60        Esquina
## 3779             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3780             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3781                          Papas Fritas Nuevo León    60        Esquina
## 3782             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3783                          Papas Fritas Nuevo León    60        Esquina
## 3784                                Quesos Nuevo León    60        Esquina
## 3785             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3786                            Malvavisco Nuevo León    60        Esquina
## 3787                       Gomas de Mazcar Nuevo León    60        Esquina
## 3788                                Quesos Nuevo León    60        Esquina
## 3789                              Tostadas Nuevo León    60        Esquina
## 3790                             Cajetilla Nuevo León    60        Esquina
## 3791                                Cremas Nuevo León    60        Esquina
## 3792                       Fruta Acidulada Nuevo León    60        Esquina
## 3793                              Frituras Nuevo León    60        Esquina
## 3794                          Papas Fritas Nuevo León    60        Esquina
## 3795                      Jugos y Néctares Nuevo León    60        Esquina
## 3796                         Jamón de Pavo Nuevo León    60        Esquina
## 3797              Salchicha HotDog y Viena Nuevo León    60        Esquina
## 3798                                Yogurt Nuevo León    60        Esquina
## 3799                 Refrescos Retornables Nuevo León    60        Esquina
## 3800                 Concentrados en Polvo Nuevo León    60        Esquina
## 3801             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3802                                Nachos Nuevo León    60        Esquina
## 3803                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 3804                                Azúcar Nuevo León    60        Esquina
## 3805                 Refrescos Retornables Nuevo León    60        Esquina
## 3806                           Empanizador Nuevo León    60        Esquina
## 3807                     Aguas Saborizadas Nuevo León    60        Esquina
## 3808                      Jugos y Néctares Nuevo León    60        Esquina
## 3809                 Concentrados en Polvo Nuevo León    60        Esquina
## 3810                               Paletas Nuevo León    60        Esquina
## 3811                          Papas Fritas Nuevo León    60        Esquina
## 3812                  Postres Refrigerados Nuevo León    60        Esquina
## 3813            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3814                             Cajetilla Nuevo León    60        Esquina
## 3815 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 3816                             Chocolate Nuevo León    60        Esquina
## 3817                               Saladas Nuevo León    60        Esquina
## 3818                 Refrescos Retornables Nuevo León    60        Esquina
## 3819            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3820                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 3821                          Papas Fritas Nuevo León    60        Esquina
## 3822                         Salsa Picante Nuevo León    60        Esquina
## 3823             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3824             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3825             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3826             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3827             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3828                              Frituras Nuevo León    60        Esquina
## 3829                            Chocolates Nuevo León    60        Esquina
## 3830               Productos sin Categoria Nuevo León    60        Esquina
## 3831             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3832             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3833                            Chocolates Nuevo León    60        Esquina
## 3834             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3835            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3836                              Sandwich Nuevo León    60        Esquina
## 3837                            Malvavisco Nuevo León    60        Esquina
## 3838                 Refrescos Retornables Nuevo León    60        Esquina
## 3839                                 Aguas Nuevo León    60        Esquina
## 3840                               Surtido Nuevo León    60        Esquina
## 3841                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3842                              Frituras Nuevo León    60        Esquina
## 3843                      Jugos y Néctares Nuevo León    60        Esquina
## 3844                 Refrescos Retornables Nuevo León    60        Esquina
## 3845                          Papas Fritas Nuevo León    60        Esquina
## 3846                     Aguas Saborizadas Nuevo León    60        Esquina
## 3847                             Chocolate Nuevo León    60        Esquina
## 3848                         Tradicionales Nuevo León    60        Esquina
## 3849                           Pastelillos Nuevo León    60        Esquina
## 3850                      Jugos y Néctares Nuevo León    60        Esquina
## 3851                                Quesos Nuevo León    60        Esquina
## 3852             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3853                   Pan de Barra Blanco Nuevo León    60        Esquina
## 3854                   Blanqueador de Ropa Nuevo León    60        Esquina
## 3855             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3856                         Salsa Picante Nuevo León    60        Esquina
## 3857                              Frituras Nuevo León    60        Esquina
## 3858                      Jugos y Néctares Nuevo León    60        Esquina
## 3859                 Concentrados en Polvo Nuevo León    60        Esquina
## 3860                              Frituras Nuevo León    60        Esquina
## 3861                 Afeitado y Depilación Nuevo León    60        Esquina
## 3862                             Pastillas Nuevo León    60        Esquina
## 3863                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3864              Salchicha HotDog y Viena Nuevo León    60        Esquina
## 3865             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3866                                 Leche Nuevo León    60        Esquina
## 3867                                  Café Nuevo León    60        Esquina
## 3868                             Cajetilla Nuevo León    60        Esquina
## 3869                           Sazonadores Nuevo León    60        Esquina
## 3870                      Jugos y Néctares Nuevo León    60        Esquina
## 3871                       Platos y Vasos  Nuevo León    60        Esquina
## 3872                       Platos y Vasos  Nuevo León    60        Esquina
## 3873             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3874                            Lavandería Nuevo León    60        Esquina
## 3875             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3876                                 Jugos Nuevo León    60        Esquina
## 3877                             Cajetilla Nuevo León    60        Esquina
## 3878                              Sandwich Nuevo León    60        Esquina
## 3879                Pan Tostado y Crotones Nuevo León    60        Esquina
## 3880                                 Leche Nuevo León    60        Esquina
## 3881               Productos sin Categoria Nuevo León    60        Esquina
## 3882            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3883               Productos sin Categoria Nuevo León    60        Esquina
## 3884                          Papas Fritas Nuevo León    60        Esquina
## 3885                              Frituras Nuevo León    60        Esquina
## 3886                              Frituras Nuevo León    60        Esquina
## 3887                          Papas Fritas Nuevo León    60        Esquina
## 3888                      Jugos y Néctares Nuevo León    60        Esquina
## 3889                             Cajetilla Nuevo León    60        Esquina
## 3890                                Quesos Nuevo León    60        Esquina
## 3891                                 Leche Nuevo León    60        Esquina
## 3892                 Refrescos Retornables Nuevo León    60        Esquina
## 3893                 Refrescos Retornables Nuevo León    60        Esquina
## 3894                 Refrescos Retornables Nuevo León    60        Esquina
## 3895                      Leche Saborizada Nuevo León    60        Esquina
## 3896             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3897                            Lavandería Nuevo León    60        Esquina
## 3898                 Refrescos Retornables Nuevo León    60        Esquina
## 3899                 Refrescos Retornables Nuevo León    60        Esquina
## 3900                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3901             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3902                              Semillas Nuevo León    60        Esquina
## 3903             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3904                 Refrescos Retornables Nuevo León    60        Esquina
## 3905                                 Leche Nuevo León    60        Esquina
## 3906                             Pastillas Nuevo León    60        Esquina
## 3907                 Refrescos Retornables Nuevo León    60        Esquina
## 3908             Palomitas para Microondas Nuevo León    60        Esquina
## 3909                               Saladas Nuevo León    60        Esquina
## 3910             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3911             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3912                                 Aguas Nuevo León    60        Esquina
## 3913                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3914                                 Leche Nuevo León    60        Esquina
## 3915             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3916                                 Trigo Nuevo León    60        Esquina
## 3917                             Cajetilla Nuevo León    60        Esquina
## 3918                   Blanqueador de Ropa Nuevo León    60        Esquina
## 3919                          Papas Fritas Nuevo León    60        Esquina
## 3920                                Quesos Nuevo León    60        Esquina
## 3921                     Aguas Saborizadas Nuevo León    60        Esquina
## 3922                      Frijoles en Lata Nuevo León    60        Esquina
## 3923                 Refrescos Retornables Nuevo León    60        Esquina
## 3924                 Refrescos Retornables Nuevo León    60        Esquina
## 3925                      Jugos y Néctares Nuevo León    60        Esquina
## 3926                              Frituras Nuevo León    60        Esquina
## 3927                                Nachos Nuevo León    60        Esquina
## 3928                              Frituras Nuevo León    60        Esquina
## 3929                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3930             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3931             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3932                             Cajetilla Nuevo León    60        Esquina
## 3933                                 Leche Nuevo León    60        Esquina
## 3934                 Refrescos Retornables Nuevo León    60        Esquina
## 3935                        Jamón de Cerdo Nuevo León    60        Esquina
## 3936 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 3937                 Pan de Barra Integral Nuevo León    60        Esquina
## 3938                                Quesos Nuevo León    60        Esquina
## 3939             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3940 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 3941                           Sazonadores Nuevo León    60        Esquina
## 3942                            Chocolates Nuevo León    60        Esquina
## 3943                             Cajetilla Nuevo León    60        Esquina
## 3944                               Surtido Nuevo León    60        Esquina
## 3945                              Frituras Nuevo León    60        Esquina
## 3946                          Papas Fritas Nuevo León    60        Esquina
## 3947                               Surtido Nuevo León    60        Esquina
## 3948                 Refrescos Retornables Nuevo León    60        Esquina
## 3949                                  Café Nuevo León    60        Esquina
## 3950                          Papas Fritas Nuevo León    60        Esquina
## 3951                             Cajetilla Nuevo León    60        Esquina
## 3952                              Frituras Nuevo León    60        Esquina
## 3953             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3954                 Refrescos Retornables Nuevo León    60        Esquina
## 3955                             Cajetilla Nuevo León    60        Esquina
## 3956                              Frituras Nuevo León    60        Esquina
## 3957             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3958                              Frituras Nuevo León    60        Esquina
## 3959                           Pastelillos Nuevo León    60        Esquina
## 3960             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3961                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3962             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3963            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3964                            Cacahuates Nuevo León    60        Esquina
## 3965             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3966                             Cajetilla Nuevo León    60        Esquina
## 3967                     Aguas Saborizadas Nuevo León    60        Esquina
## 3968                             Cajetilla Nuevo León    60        Esquina
## 3969                          Papas Fritas Nuevo León    60        Esquina
## 3970             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3971                 Refrescos Retornables Nuevo León    60        Esquina
## 3972             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3973             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3974             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3975                                   Sal Nuevo León    60        Esquina
## 3976             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3977                 Refrescos Retornables Nuevo León    60        Esquina
## 3978               Productos sin Categoria Nuevo León    60        Esquina
## 3979                          Pasta Dental Nuevo León    60        Esquina
## 3980                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3981            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3982                                 Aguas Nuevo León    60        Esquina
## 3983                 Pan de Barra Integral Nuevo León    60        Esquina
## 3984                                Azúcar Nuevo León    60        Esquina
## 3985                                 Leche Nuevo León    60        Esquina
## 3986                      Jugos y Néctares Nuevo León    60        Esquina
## 3987                                  Lata Nuevo León    60        Esquina
## 3988             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3989                             Cajetilla Nuevo León    60        Esquina
## 3990             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3991                 Pan de Barra Integral Nuevo León    60        Esquina
## 3992                                 Leche Nuevo León    60        Esquina
## 3993             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3994                              Sandwich Nuevo León    60        Esquina
## 3995             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 3996                                  Lata Nuevo León    60        Esquina
## 3997            Energizantes e Hidratantes Nuevo León    60        Esquina
## 3998                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 3999             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4000                           Lavatrastes Nuevo León    60        Esquina
## 4001                    Cuidado de la Piel Nuevo León    60        Esquina
## 4002                 Refrescos Retornables Nuevo León    60        Esquina
## 4003                                 Leche Nuevo León    60        Esquina
## 4004                          Papas Fritas Nuevo León    60        Esquina
## 4005                            Lavandería Nuevo León    60        Esquina
## 4006                      Jugos y Néctares Nuevo León    60        Esquina
## 4007                 Refrescos Retornables Nuevo León    60        Esquina
## 4008             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4009                            Chocolates Nuevo León    60        Esquina
## 4010                 Refrescos Retornables Nuevo León    60        Esquina
## 4011                                 Leche Nuevo León    60        Esquina
## 4012             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4013                            Chocolates Nuevo León    60        Esquina
## 4014                              Sandwich Nuevo León    60        Esquina
## 4015                 Refrescos Retornables Nuevo León    60        Esquina
## 4016 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4017                                 Aguas Nuevo León    60        Esquina
## 4018             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4019                            Chocolates Nuevo León    60        Esquina
## 4020                              Frituras Nuevo León    60        Esquina
## 4021               Productos sin Categoria Nuevo León    60        Esquina
## 4022                          Papas Fritas Nuevo León    60        Esquina
## 4023                              Sandwich Nuevo León    60        Esquina
## 4024                                Quesos Nuevo León    60        Esquina
## 4025                           Pastelillos Nuevo León    60        Esquina
## 4026             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4027                      Higiene Femenina Nuevo León    60        Esquina
## 4028                              Frituras Nuevo León    60        Esquina
## 4029                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4030             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4031                           Frijol Bayo Nuevo León    60        Esquina
## 4032                              Frituras Nuevo León    60        Esquina
## 4033                              Sandwich Nuevo León    60        Esquina
## 4034                                Quesos Nuevo León    60        Esquina
## 4035                 Refrescos Retornables Nuevo León    60        Esquina
## 4036             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4037                          Papas Fritas Nuevo León    60        Esquina
## 4038                              Frituras Nuevo León    60        Esquina
## 4039                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4040                           Pastelillos Nuevo León    60        Esquina
## 4041                          Papas Fritas Nuevo León    60        Esquina
## 4042             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4043                                 Aguas Nuevo León    60        Esquina
## 4044                             Té helado Nuevo León    60        Esquina
## 4045             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4046                                 Aguas Nuevo León    60        Esquina
## 4047                             Cajetilla Nuevo León    60        Esquina
## 4048             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4049                            Malvavisco Nuevo León    60        Esquina
## 4050                                Yogurt Nuevo León    60        Esquina
## 4051            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4052                      Jugos y Néctares Nuevo León    60        Esquina
## 4053                     Aguas Saborizadas Nuevo León    60        Esquina
## 4054             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4055                 Refrescos Retornables Nuevo León    60        Esquina
## 4056 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4057             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4058                 Refrescos Retornables Nuevo León    60        Esquina
## 4059                      Frijoles en Lata Nuevo León    60        Esquina
## 4060                           Pastelillos Nuevo León    60        Esquina
## 4061             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4062               Productos sin Categoria Nuevo León    60        Esquina
## 4063                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4064             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4065                              Sandwich Nuevo León    60        Esquina
## 4066             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4067                      Leche Saborizada Nuevo León    60        Esquina
## 4068                 Refrescos Retornables Nuevo León    60        Esquina
## 4069                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4070                           Pastelillos Nuevo León    60        Esquina
## 4071                              Frituras Nuevo León    60        Esquina
## 4072             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4073                              Sandwich Nuevo León    60        Esquina
## 4074                              Frituras Nuevo León    60        Esquina
## 4075             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4076                    Sopas Instantáneas Nuevo León    60        Esquina
## 4077                      Leche Saborizada Nuevo León    60        Esquina
## 4078                 Refrescos Retornables Nuevo León    60        Esquina
## 4079                           Pastelillos Nuevo León    60        Esquina
## 4080             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4081             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4082                   Pastas de Figuritas Nuevo León    60        Esquina
## 4083             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4084                              Frituras Nuevo León    60        Esquina
## 4085                              Frituras Nuevo León    60        Esquina
## 4086                              Frituras Nuevo León    60        Esquina
## 4087                              Frituras Nuevo León    60        Esquina
## 4088                                 Leche Nuevo León    60        Esquina
## 4089             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4090                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4091                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4092                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4093             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4094             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4095                              Frituras Nuevo León    60        Esquina
## 4096                 Refrescos Retornables Nuevo León    60        Esquina
## 4097                         Frijol Varios Nuevo León    60        Esquina
## 4098                          Papas Fritas Nuevo León    60        Esquina
## 4099                               Surtido Nuevo León    60        Esquina
## 4100                          Papas Fritas Nuevo León    60        Esquina
## 4101                                 Leche Nuevo León    60        Esquina
## 4102                             Pastillas Nuevo León    60        Esquina
## 4103                                 Aguas Nuevo León    60        Esquina
## 4104                                  Atún Nuevo León    60        Esquina
## 4105             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4106                                 Aguas Nuevo León    60        Esquina
## 4107                             Cajetilla Nuevo León    60        Esquina
## 4108                 Concentrados en Polvo Nuevo León    60        Esquina
## 4109                                Yogurt Nuevo León    60        Esquina
## 4110                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4111                             Cajetilla Nuevo León    60        Esquina
## 4112                              Frituras Nuevo León    60        Esquina
## 4113                              Frituras Nuevo León    60        Esquina
## 4114                           Pastelillos Nuevo León    60        Esquina
## 4115             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4116                 Concentrados en Polvo Nuevo León    60        Esquina
## 4117                                Azúcar Nuevo León    60        Esquina
## 4118             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4119                   Pastas de Figuritas Nuevo León    60        Esquina
## 4120             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4121                    Sopas Instantáneas Nuevo León    60        Esquina
## 4122                 Refrescos Retornables Nuevo León    60        Esquina
## 4123                            Tamarindos Nuevo León    60        Esquina
## 4124            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4125            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4126                                Polvos Nuevo León    60        Esquina
## 4127                     Refrescos en Lata Nuevo León    60        Esquina
## 4128             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4129                              Frituras Nuevo León    60        Esquina
## 4130             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4131                   Blanqueador de Ropa Nuevo León    60        Esquina
## 4132                            Lavandería Nuevo León    60        Esquina
## 4133                           Pastelillos Nuevo León    60        Esquina
## 4134                                Yogurt Nuevo León    60        Esquina
## 4135                 Refrescos Retornables Nuevo León    60        Esquina
## 4136             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4137             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4138                         Avena y Fibra Nuevo León    60        Esquina
## 4139                             Cajetilla Nuevo León    60        Esquina
## 4140                    Barras Energéticas Nuevo León    60        Esquina
## 4141             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4142                              Cerillos Nuevo León    60        Esquina
## 4143             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4144                            Lavandería Nuevo León    60        Esquina
## 4145             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4146                              Frituras Nuevo León    60        Esquina
## 4147                                 Leche Nuevo León    60        Esquina
## 4148                                 Aguas Nuevo León    60        Esquina
## 4149                 Refrescos Retornables Nuevo León    60        Esquina
## 4150                          Papas Fritas Nuevo León    60        Esquina
## 4151                              Frituras Nuevo León    60        Esquina
## 4152                     Aguas Saborizadas Nuevo León    60        Esquina
## 4153                           Pastelillos Nuevo León    60        Esquina
## 4154             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4155                            Lavandería Nuevo León    60        Esquina
## 4156                            Lavandería Nuevo León    60        Esquina
## 4157                      Frijoles en Lata Nuevo León    60        Esquina
## 4158                  Postres Refrigerados Nuevo León    60        Esquina
## 4159                                Yogurt Nuevo León    60        Esquina
## 4160                            Lavandería Nuevo León    60        Esquina
## 4161                   Blanqueador de Ropa Nuevo León    60        Esquina
## 4162                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4163                            Lavandería Nuevo León    60        Esquina
## 4164               Productos sin Categoria Nuevo León    60        Esquina
## 4165                   Cuidado del Cabello Nuevo León    60        Esquina
## 4166               Productos sin Categoria Nuevo León    60        Esquina
## 4167                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4168             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4169                Pan Tostado y Crotones Nuevo León    60        Esquina
## 4170                                 Leche Nuevo León    60        Esquina
## 4171             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4172                 Concentrados en Polvo Nuevo León    60        Esquina
## 4173                  Chicharrón de Harina Nuevo León    60        Esquina
## 4174                      Jugos y Néctares Nuevo León    60        Esquina
## 4175             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4176             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4177                                 Leche Nuevo León    60        Esquina
## 4178                                 Leche Nuevo León    60        Esquina
## 4179                                  Café Nuevo León    60        Esquina
## 4180             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4181                 Refrescos Retornables Nuevo León    60        Esquina
## 4182                 Refrescos Retornables Nuevo León    60        Esquina
## 4183                                 Leche Nuevo León    60        Esquina
## 4184                                Yogurt Nuevo León    60        Esquina
## 4185                                 Leche Nuevo León    60        Esquina
## 4186                 Refrescos Retornables Nuevo León    60        Esquina
## 4187                             Pastillas Nuevo León    60        Esquina
## 4188             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4189                      Jugos y Néctares Nuevo León    60        Esquina
## 4190             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4191                      Jugos y Néctares Nuevo León    60        Esquina
## 4192             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4193                           Servilletas Nuevo León    60        Esquina
## 4194             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4195                      Leche Saborizada Nuevo León    60        Esquina
## 4196            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4197                      Jugos y Néctares Nuevo León    60        Esquina
## 4198                 Refrescos Retornables Nuevo León    60        Esquina
## 4199                 Refrescos Retornables Nuevo León    60        Esquina
## 4200                 Refrescos Retornables Nuevo León    60        Esquina
## 4201                                  Atún Nuevo León    60        Esquina
## 4202                 Refrescos Retornables Nuevo León    60        Esquina
## 4203                                 Aguas Nuevo León    60        Esquina
## 4204                              Frituras Nuevo León    60        Esquina
## 4205             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4206                            Chocolates Nuevo León    60        Esquina
## 4207                            Lavandería Nuevo León    60        Esquina
## 4208                            Lavandería Nuevo León    60        Esquina
## 4209                              Frituras Nuevo León    60        Esquina
## 4210                                 Leche Nuevo León    60        Esquina
## 4211                             Chocolate Nuevo León    60        Esquina
## 4212            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4213                 Refrescos Retornables Nuevo León    60        Esquina
## 4214                                  Mole Nuevo León    60        Esquina
## 4215                            Lavandería Nuevo León    60        Esquina
## 4216                                  Lata Nuevo León    60        Esquina
## 4217                                 Arroz Nuevo León    60        Esquina
## 4218                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4219                 Refrescos Retornables Nuevo León    60        Esquina
## 4220                                 Aguas Nuevo León    60        Esquina
## 4221                     Aguas Saborizadas Nuevo León    60        Esquina
## 4222                      Jugos y Néctares Nuevo León    60        Esquina
## 4223             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4224                         Frijol Varios Nuevo León    60        Esquina
## 4225             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4226                 Refrescos Retornables Nuevo León    60        Esquina
## 4227                                  Lata Nuevo León    60        Esquina
## 4228                              Frituras Nuevo León    60        Esquina
## 4229             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4230               Productos sin Categoria Nuevo León    60        Esquina
## 4231                            Chocolates Nuevo León    60        Esquina
## 4232             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4233         Fideos, Spaguetti, Tallarines Nuevo León    60        Esquina
## 4234                                  Lata Nuevo León    60        Esquina
## 4235                 Refrescos Retornables Nuevo León    60        Esquina
## 4236                                Nachos Nuevo León    60        Esquina
## 4237             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4238             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4239             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4240                 Refrescos Retornables Nuevo León    60        Esquina
## 4241                 Refrescos Retornables Nuevo León    60        Esquina
## 4242             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4243             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4244                 Refrescos Retornables Nuevo León    60        Esquina
## 4245                                Cremas Nuevo León    60        Esquina
## 4246                                Nachos Nuevo León    60        Esquina
## 4247                              Frituras Nuevo León    60        Esquina
## 4248                          Papas Fritas Nuevo León    60        Esquina
## 4249             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4250                            Malvavisco Nuevo León    60        Esquina
## 4251            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4252                 Refrescos Retornables Nuevo León    60        Esquina
## 4253             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4254                      Jugos y Néctares Nuevo León    60        Esquina
## 4255                              Frituras Nuevo León    60        Esquina
## 4256                               Surtido Nuevo León    60        Esquina
## 4257                      Chiles Envasados Nuevo León    60        Esquina
## 4258                      Jugos y Néctares Nuevo León    60        Esquina
## 4259                               Surtido Nuevo León    60        Esquina
## 4260                              Frituras Nuevo León    60        Esquina
## 4261                      Jugos y Néctares Nuevo León    60        Esquina
## 4262                 Refrescos Retornables Nuevo León    60        Esquina
## 4263             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4264             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4265             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4266                 Concentrados en Polvo Nuevo León    60        Esquina
## 4267                               Consome Nuevo León    60        Esquina
## 4268                              Frituras Nuevo León    60        Esquina
## 4269                 Refrescos Retornables Nuevo León    60        Esquina
## 4270                           Servilletas Nuevo León    60        Esquina
## 4271                       Platos y Vasos  Nuevo León    60        Esquina
## 4272                 Refrescos Retornables Nuevo León    60        Esquina
## 4273             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4274                       Platos y Vasos  Nuevo León    60        Esquina
## 4275                              Frituras Nuevo León    60        Esquina
## 4276             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4277                            Malvavisco Nuevo León    60        Esquina
## 4278                             Cajetilla Nuevo León    60        Esquina
## 4279                           Empanizador Nuevo León    60        Esquina
## 4280                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4281                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4282                                Cremas Nuevo León    60        Esquina
## 4283                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4284                           Pastelillos Nuevo León    60        Esquina
## 4285                              Frituras Nuevo León    60        Esquina
## 4286                              Frituras Nuevo León    60        Esquina
## 4287                 Refrescos Retornables Nuevo León    60        Esquina
## 4288                              Frituras Nuevo León    60        Esquina
## 4289                       Papel Higiénico Nuevo León    60        Esquina
## 4290                            Tropicales Nuevo León    60        Esquina
## 4291             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4292             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4293                 Refrescos Retornables Nuevo León    60        Esquina
## 4294                       Platos y Vasos  Nuevo León    60        Esquina
## 4295                            Lavandería Nuevo León    60        Esquina
## 4296             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4297                                 Leche Nuevo León    60        Esquina
## 4298             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4299             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4300             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4301                              Frituras Nuevo León    60        Esquina
## 4302                              Frituras Nuevo León    60        Esquina
## 4303             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4304                               Consome Nuevo León    60        Esquina
## 4305             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4306                               Consome Nuevo León    60        Esquina
## 4307                 Concentrados en Polvo Nuevo León    60        Esquina
## 4308                      Jugos y Néctares Nuevo León    60        Esquina
## 4309                      Jugos y Néctares Nuevo León    60        Esquina
## 4310             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4311                             Cajetilla Nuevo León    60        Esquina
## 4312                              Frituras Nuevo León    60        Esquina
## 4313                      Jugos y Néctares Nuevo León    60        Esquina
## 4314                                Catsup Nuevo León    60        Esquina
## 4315                 Refrescos Retornables Nuevo León    60        Esquina
## 4316                               Surtido Nuevo León    60        Esquina
## 4317            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4318                              Frituras Nuevo León    60        Esquina
## 4319                         Sal Combinada Nuevo León    60        Esquina
## 4320                    Sopas Instantáneas Nuevo León    60        Esquina
## 4321                    Sopas Instantáneas Nuevo León    60        Esquina
## 4322             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4323                                  Lata Nuevo León    60        Esquina
## 4324                             Cajetilla Nuevo León    60        Esquina
## 4325                                 Aguas Nuevo León    60        Esquina
## 4326                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4327                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 4328             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4329                 Refrescos Retornables Nuevo León    60        Esquina
## 4330                            Cacahuates Nuevo León    60        Esquina
## 4331                  Chicharrón de Harina Nuevo León    60        Esquina
## 4332                          Papas Fritas Nuevo León    60        Esquina
## 4333                              Frituras Nuevo León    60        Esquina
## 4334             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4335                                Nachos Nuevo León    60        Esquina
## 4336                              Frituras Nuevo León    60        Esquina
## 4337             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4338                                 Aguas Nuevo León    60        Esquina
## 4339                              Frituras Nuevo León    60        Esquina
## 4340                 Concentrados en Polvo Nuevo León    60        Esquina
## 4341                             Cajetilla Nuevo León    60        Esquina
## 4342                             Cajetilla Nuevo León    60        Esquina
## 4343                              Tostadas Nuevo León    60        Esquina
## 4344                            Lavandería Nuevo León    60        Esquina
## 4345                            Lavandería Nuevo León    60        Esquina
## 4346             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4347                  Postres Refrigerados Nuevo León    60        Esquina
## 4348                                 Leche Nuevo León    60        Esquina
## 4349             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4350                 Concentrados en Polvo Nuevo León    60        Esquina
## 4351                                Yogurt Nuevo León    60        Esquina
## 4352                 Refrescos Retornables Nuevo León    60        Esquina
## 4353                 Refrescos Retornables Nuevo León    60        Esquina
## 4354                    Sopas Instantáneas Nuevo León    60        Esquina
## 4355             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4356                  Postres Refrigerados Nuevo León    60        Esquina
## 4357                               Saladas Nuevo León    60        Esquina
## 4358                  Postres Refrigerados Nuevo León    60        Esquina
## 4359                      Leche Saborizada Nuevo León    60        Esquina
## 4360             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4361                              Frituras Nuevo León    60        Esquina
## 4362             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4363                 Refrescos Retornables Nuevo León    60        Esquina
## 4364             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4365             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4366             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4367                      Chiles Envasados Nuevo León    60        Esquina
## 4368                 Concentrados en Polvo Nuevo León    60        Esquina
## 4369                           Empanizador Nuevo León    60        Esquina
## 4370                 Refrescos Retornables Nuevo León    60        Esquina
## 4371                              Frituras Nuevo León    60        Esquina
## 4372                               Surtido Nuevo León    60        Esquina
## 4373                              Frituras Nuevo León    60        Esquina
## 4374         Fideos, Spaguetti, Tallarines Nuevo León    60        Esquina
## 4375                 Refrescos Retornables Nuevo León    60        Esquina
## 4376                      Higiene Femenina Nuevo León    60        Esquina
## 4377                            Chocolates Nuevo León    60        Esquina
## 4378                              Frituras Nuevo León    60        Esquina
## 4379                            Chocolates Nuevo León    60        Esquina
## 4380                      Jugos y Néctares Nuevo León    60        Esquina
## 4381            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4382                              Frituras Nuevo León    60        Esquina
## 4383                                Yogurt Nuevo León    60        Esquina
## 4384             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4385                                  Lata Nuevo León    60        Esquina
## 4386                      Jugos y Néctares Nuevo León    60        Esquina
## 4387             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4388                              Tostadas Nuevo León    60        Esquina
## 4389             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4390                            Malvavisco Nuevo León    60        Esquina
## 4391                            Tropicales Nuevo León    60        Esquina
## 4392                              Frituras Nuevo León    60        Esquina
## 4393             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4394                              Frituras Nuevo León    60        Esquina
## 4395             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4396             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4397             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4398             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4399 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4400                   Chicharrón de Cerdo Nuevo León    60        Esquina
## 4401             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4402             Palomitas para Microondas Nuevo León    60        Esquina
## 4403                          Papas Fritas Nuevo León    60        Esquina
## 4404                      Leche Saborizada Nuevo León    60        Esquina
## 4405            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4406                              Frituras Nuevo León    60        Esquina
## 4407                      Leche Saborizada Nuevo León    60        Esquina
## 4408             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4409                              Frituras Nuevo León    60        Esquina
## 4410                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4411                              Frituras Nuevo León    60        Esquina
## 4412                                 Aguas Nuevo León    60        Esquina
## 4413                 Refrescos Retornables Nuevo León    60        Esquina
## 4414                                Cremas Nuevo León    60        Esquina
## 4415                              Frituras Nuevo León    60        Esquina
## 4416                              Frituras Nuevo León    60        Esquina
## 4417                     Aguas Saborizadas Nuevo León    60        Esquina
## 4418                              Frituras Nuevo León    60        Esquina
## 4419                              Frituras Nuevo León    60        Esquina
## 4420                              Frituras Nuevo León    60        Esquina
## 4421                          Papas Fritas Nuevo León    60        Esquina
## 4422                                 Leche Nuevo León    60        Esquina
## 4423                         Jamón de Pavo Nuevo León    60        Esquina
## 4424             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4425                           Lavatrastes Nuevo León    60        Esquina
## 4426                            Lavandería Nuevo León    60        Esquina
## 4427                             Chocolate Nuevo León    60        Esquina
## 4428                      Jugos y Néctares Nuevo León    60        Esquina
## 4429                               Consome Nuevo León    60        Esquina
## 4430             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4431                 Refrescos Retornables Nuevo León    60        Esquina
## 4432                           Servilletas Nuevo León    60        Esquina
## 4433                              Frituras Nuevo León    60        Esquina
## 4434                          Papas Fritas Nuevo León    60        Esquina
## 4435                              Frituras Nuevo León    60        Esquina
## 4436                         Salsa Picante Nuevo León    60        Esquina
## 4437                      Frijoles en Lata Nuevo León    60        Esquina
## 4438                            Cacahuates Nuevo León    60        Esquina
## 4439                      Jugos y Néctares Nuevo León    60        Esquina
## 4440                          Papas Fritas Nuevo León    60        Esquina
## 4441                              Frituras Nuevo León    60        Esquina
## 4442                              Frituras Nuevo León    60        Esquina
## 4443             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4444             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4445                   Cuidado del Cabello Nuevo León    60        Esquina
## 4446                               Surtido Nuevo León    60        Esquina
## 4447             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4448                 Refrescos Retornables Nuevo León    60        Esquina
## 4449                               Paletas Nuevo León    60        Esquina
## 4450             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4451                              Frituras Nuevo León    60        Esquina
## 4452             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4453                      Jugos y Néctares Nuevo León    60        Esquina
## 4454                               Surtido Nuevo León    60        Esquina
## 4455             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4456             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4457             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4458                               Paletas Nuevo León    60        Esquina
## 4459            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4460                 Concentrados en Polvo Nuevo León    60        Esquina
## 4461             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4462                              Frituras Nuevo León    60        Esquina
## 4463                             Mayonesa  Nuevo León    60        Esquina
## 4464                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4465                            Chocolates Nuevo León    60        Esquina
## 4466                               Paletas Nuevo León    60        Esquina
## 4467                                   Sal Nuevo León    60        Esquina
## 4468                            Lavandería Nuevo León    60        Esquina
## 4469             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4470                 Refrescos Retornables Nuevo León    60        Esquina
## 4471                 Refrescos Retornables Nuevo León    60        Esquina
## 4472             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4473                              Frituras Nuevo León    60        Esquina
## 4474                                Catsup Nuevo León    60        Esquina
## 4475                             Cajetilla Nuevo León    60        Esquina
## 4476             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4477             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4478                                  Lata Nuevo León    60        Esquina
## 4479                 Concentrados en Polvo Nuevo León    60        Esquina
## 4480                              Frituras Nuevo León    60        Esquina
## 4481                           Pastelillos Nuevo León    60        Esquina
## 4482             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4483                 Refrescos Retornables Nuevo León    60        Esquina
## 4484                         Salsa Picante Nuevo León    60        Esquina
## 4485                 Refrescos Retornables Nuevo León    60        Esquina
## 4486                       Papel Higiénico Nuevo León    60        Esquina
## 4487                 Refrescos Retornables Nuevo León    60        Esquina
## 4488                 Concentrados en Polvo Nuevo León    60        Esquina
## 4489                               Consome Nuevo León    60        Esquina
## 4490             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4491                                Cremas Nuevo León    60        Esquina
## 4492             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4493                                  Lata Nuevo León    60        Esquina
## 4494                              Tostadas Nuevo León    60        Esquina
## 4495                      Jugos y Néctares Nuevo León    60        Esquina
## 4496                                  Lata Nuevo León    60        Esquina
## 4497                                   Sal Nuevo León    60        Esquina
## 4498                               Consome Nuevo León    60        Esquina
## 4499             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4500                           Sazonadores Nuevo León    60        Esquina
## 4501                          Papas Fritas Nuevo León    60        Esquina
## 4502                              Frituras Nuevo León    60        Esquina
## 4503                              Frituras Nuevo León    60        Esquina
## 4504             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4505 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4506                 Refrescos Retornables Nuevo León    60        Esquina
## 4507                               Surtido Nuevo León    60        Esquina
## 4508             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4509                                 Leche Nuevo León    60        Esquina
## 4510                  Postres Refrigerados Nuevo León    60        Esquina
## 4511                 Concentrados en Polvo Nuevo León    60        Esquina
## 4512                                  Atún Nuevo León    60        Esquina
## 4513             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4514                                Yogurt Nuevo León    60        Esquina
## 4515             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4516             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4517                            Lavandería Nuevo León    60        Esquina
## 4518                              Frituras Nuevo León    60        Esquina
## 4519                                  Lata Nuevo León    60        Esquina
## 4520                            Cacahuates Nuevo León    60        Esquina
## 4521                          Papas Fritas Nuevo León    60        Esquina
## 4522                              Frituras Nuevo León    60        Esquina
## 4523                                 Aguas Nuevo León    60        Esquina
## 4524            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4525                      Chiles Envasados Nuevo León    60        Esquina
## 4526                 Refrescos Retornables Nuevo León    60        Esquina
## 4527                               Consome Nuevo León    60        Esquina
## 4528                           Sazonadores Nuevo León    60        Esquina
## 4529                               Saladas Nuevo León    60        Esquina
## 4530                              Frituras Nuevo León    60        Esquina
## 4531               Productos sin Categoria Nuevo León    60        Esquina
## 4532                                   Sal Nuevo León    60        Esquina
## 4533             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4534                 Concentrados en Polvo Nuevo León    60        Esquina
## 4535                                 Arroz Nuevo León    60        Esquina
## 4536                          Papas Fritas Nuevo León    60        Esquina
## 4537                      Jugos y Néctares Nuevo León    60        Esquina
## 4538             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4539                 Refrescos Retornables Nuevo León    60        Esquina
## 4540                         Sal Combinada Nuevo León    60        Esquina
## 4541                              Frituras Nuevo León    60        Esquina
## 4542                            Lavandería Nuevo León    60        Esquina
## 4543                            Lavandería Nuevo León    60        Esquina
## 4544                   Pan de Barra Blanco Nuevo León    60        Esquina
## 4545                      Chiles Envasados Nuevo León    60        Esquina
## 4546                             Mayonesa  Nuevo León    60        Esquina
## 4547                                Quesos Nuevo León    60        Esquina
## 4548                    Sopas Instantáneas Nuevo León    60        Esquina
## 4549                      Jugos y Néctares Nuevo León    60        Esquina
## 4550             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4551                              Frituras Nuevo León    60        Esquina
## 4552                      Frutas Envasadas Nuevo León    60        Esquina
## 4553            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4554                 Concentrados en Polvo Nuevo León    60        Esquina
## 4555                              Frituras Nuevo León    60        Esquina
## 4556                          Papas Fritas Nuevo León    60        Esquina
## 4557                                Nachos Nuevo León    60        Esquina
## 4558                              Frituras Nuevo León    60        Esquina
## 4559                     Aguas Saborizadas Nuevo León    60        Esquina
## 4560                               Saladas Nuevo León    60        Esquina
## 4561                              Frituras Nuevo León    60        Esquina
## 4562             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4563             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4564                                Quesos Nuevo León    60        Esquina
## 4565                            Lavandería Nuevo León    60        Esquina
## 4566                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4567                              Frituras Nuevo León    60        Esquina
## 4568                 Refrescos Retornables Nuevo León    60        Esquina
## 4569             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4570                    Comida para Perros Nuevo León    60        Esquina
## 4571                         Jamón de Pavo Nuevo León    60        Esquina
## 4572                      Jugos y Néctares Nuevo León    60        Esquina
## 4573             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4574                            Lavandería Nuevo León    60        Esquina
## 4575               Productos sin Categoria Nuevo León    60        Esquina
## 4576                 Refrescos Retornables Nuevo León    60        Esquina
## 4577                 Pan de Barra Integral Nuevo León    60        Esquina
## 4578                                 Leche Nuevo León    60        Esquina
## 4579             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4580                                  Lata Nuevo León    60        Esquina
## 4581                 Concentrados en Polvo Nuevo León    60        Esquina
## 4582             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4583                               Saladas Nuevo León    60        Esquina
## 4584             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4585             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4586             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4587                                Cremas Nuevo León    60        Esquina
## 4588 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4589                      Chiles Envasados Nuevo León    60        Esquina
## 4590             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4591                                Catsup Nuevo León    60        Esquina
## 4592                     Aguas Saborizadas Nuevo León    60        Esquina
## 4593               Productos sin Categoria Nuevo León    60        Esquina
## 4594                               Saladas Nuevo León    60        Esquina
## 4595                             Pastillas Nuevo León    60        Esquina
## 4596                             Chocolate Nuevo León    60        Esquina
## 4597                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4598                                Yogurt Nuevo León    60        Esquina
## 4599             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4600                 Refrescos Retornables Nuevo León    60        Esquina
## 4601                              Frituras Nuevo León    60        Esquina
## 4602             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4603                                Quesos Nuevo León    60        Esquina
## 4604                      Jugos y Néctares Nuevo León    60        Esquina
## 4605                             Cajetilla Nuevo León    60        Esquina
## 4606                            Chocolates Nuevo León    60        Esquina
## 4607                 Refrescos Retornables Nuevo León    60        Esquina
## 4608                      Jugos y Néctares Nuevo León    60        Esquina
## 4609                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4610               Productos sin Categoria Nuevo León    60        Esquina
## 4611                   Blanqueador de Ropa Nuevo León    60        Esquina
## 4612                          Papas Fritas Nuevo León    60        Esquina
## 4613             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4614                 Refrescos Retornables Nuevo León    60        Esquina
## 4615                            Lavandería Nuevo León    60        Esquina
## 4616                              Frituras Nuevo León    60        Esquina
## 4617                  Postres Refrigerados Nuevo León    60        Esquina
## 4618                            Cacahuates Nuevo León    60        Esquina
## 4619                 Refrescos Retornables Nuevo León    60        Esquina
## 4620                               Paletas Nuevo León    60        Esquina
## 4621                      Chiles Envasados Nuevo León    60        Esquina
## 4622                   Pan de Barra Blanco Nuevo León    60        Esquina
## 4623             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4624             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4625                            Chocolates Nuevo León    60        Esquina
## 4626                      Jugos y Néctares Nuevo León    60        Esquina
## 4627             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4628             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4629                             Cajetilla Nuevo León    60        Esquina
## 4630             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4631                                 Aguas Nuevo León    60        Esquina
## 4632                           Lavatrastes Nuevo León    60        Esquina
## 4633             Palomitas para Microondas Nuevo León    60        Esquina
## 4634                         Jamón de Pavo Nuevo León    60        Esquina
## 4635             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4636             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4637             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4638             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4639                 Refrescos Retornables Nuevo León    60        Esquina
## 4640                      Leche Saborizada Nuevo León    60        Esquina
## 4641                           Pastelillos Nuevo León    60        Esquina
## 4642               Productos sin Categoria Nuevo León    60        Esquina
## 4643                                Yogurt Nuevo León    60        Esquina
## 4644                             Cajetilla Nuevo León    60        Esquina
## 4645                                  Atún Nuevo León    60        Esquina
## 4646             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4647                           Servilletas Nuevo León    60        Esquina
## 4648                 Concentrados en Polvo Nuevo León    60        Esquina
## 4649                                  Lata Nuevo León    60        Esquina
## 4650                                 Aguas Nuevo León    60        Esquina
## 4651              Salchicha HotDog y Viena Nuevo León    60        Esquina
## 4652                             Cajetilla Nuevo León    60        Esquina
## 4653                  Chicharrón de Harina Nuevo León    60        Esquina
## 4654                              Frituras Nuevo León    60        Esquina
## 4655             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4656             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4657                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4658                            Lavandería Nuevo León    60        Esquina
## 4659             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4660                             Cajetilla Nuevo León    60        Esquina
## 4661             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4662                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4663                           Empanizador Nuevo León    60        Esquina
## 4664                              Frituras Nuevo León    60        Esquina
## 4665                              Frituras Nuevo León    60        Esquina
## 4666             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4667            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4668             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4669                                 Aguas Nuevo León    60        Esquina
## 4670                        Salsa Botanera Nuevo León    60        Esquina
## 4671             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4672                        Leche en Polvo Nuevo León    60        Esquina
## 4673                 Refrescos Retornables Nuevo León    60        Esquina
## 4674                              Frituras Nuevo León    60        Esquina
## 4675                      Higiene Femenina Nuevo León    60        Esquina
## 4676             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4677             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4678                            Azucarados Nuevo León    60        Esquina
## 4679                 Refrescos Retornables Nuevo León    60        Esquina
## 4680                                 Leche Nuevo León    60        Esquina
## 4681                             Cajetilla Nuevo León    60        Esquina
## 4682                     Aguas Saborizadas Nuevo León    60        Esquina
## 4683                             Cajetilla Nuevo León    60        Esquina
## 4684                      Jugos y Néctares Nuevo León    60        Esquina
## 4685                      Jugos y Néctares Nuevo León    60        Esquina
## 4686                              Tostadas Nuevo León    60        Esquina
## 4687                           Frijol Bayo Nuevo León    60        Esquina
## 4688             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4689                            Chocolates Nuevo León    60        Esquina
## 4690                              Frituras Nuevo León    60        Esquina
## 4691                                Yogurt Nuevo León    60        Esquina
## 4692                      Jugos y Néctares Nuevo León    60        Esquina
## 4693                              Frituras Nuevo León    60        Esquina
## 4694                 Refrescos Retornables Nuevo León    60        Esquina
## 4695                                  Lata Nuevo León    60        Esquina
## 4696                                Yogurt Nuevo León    60        Esquina
## 4697                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4698             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4699                 Refrescos Retornables Nuevo León    60        Esquina
## 4700                             Mayonesa  Nuevo León    60        Esquina
## 4701                 Concentrados en Polvo Nuevo León    60        Esquina
## 4702                 Concentrados en Polvo Nuevo León    60        Esquina
## 4703                                Cremas Nuevo León    60        Esquina
## 4704                            Chocolates Nuevo León    60        Esquina
## 4705                          Papas Fritas Nuevo León    60        Esquina
## 4706             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4707             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4708                 Refrescos Retornables Nuevo León    60        Esquina
## 4709                                Yogurt Nuevo León    60        Esquina
## 4710                               Consome Nuevo León    60        Esquina
## 4711             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4712                                  Lata Nuevo León    60        Esquina
## 4713                          Papas Fritas Nuevo León    60        Esquina
## 4714                              Frituras Nuevo León    60        Esquina
## 4715                              Tostadas Nuevo León    60        Esquina
## 4716                    Sopas Instantáneas Nuevo León    60        Esquina
## 4717                      Frijoles en Lata Nuevo León    60        Esquina
## 4718                                Quesos Nuevo León    60        Esquina
## 4719             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4720                    Sopas Instantáneas Nuevo León    60        Esquina
## 4721               Productos sin Categoria Nuevo León    60        Esquina
## 4722                                  Mole Nuevo León    60        Esquina
## 4723                 Concentrados en Polvo Nuevo León    60        Esquina
## 4724                                Azúcar Nuevo León    60        Esquina
## 4725                                Cremas Nuevo León    60        Esquina
## 4726                           Pastelillos Nuevo León    60        Esquina
## 4727                       Cremas de Nieve Nuevo León    60        Esquina
## 4728                                Yogurt Nuevo León    60        Esquina
## 4729               Productos sin Categoria Nuevo León    60        Esquina
## 4730                  Postres Refrigerados Nuevo León    60        Esquina
## 4731                           Empanizador Nuevo León    60        Esquina
## 4732                                 Leche Nuevo León    60        Esquina
## 4733                       Papel Higiénico Nuevo León    60        Esquina
## 4734                                 Arroz Nuevo León    60        Esquina
## 4735                            Lavandería Nuevo León    60        Esquina
## 4736                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4737                          Pasta Dental Nuevo León    60        Esquina
## 4738                               Saladas Nuevo León    60        Esquina
## 4739             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4740            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4741                 Refrescos Retornables Nuevo León    60        Esquina
## 4742                   Blanqueador de Ropa Nuevo León    60        Esquina
## 4743             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4744             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4745                                  Maíz Nuevo León    60        Esquina
## 4746                 Concentrados en Polvo Nuevo León    60        Esquina
## 4747                 Concentrados en Polvo Nuevo León    60        Esquina
## 4748                         Desodorantes  Nuevo León    60        Esquina
## 4749                 Refrescos Retornables Nuevo León    60        Esquina
## 4750                      Jugos y Néctares Nuevo León    60        Esquina
## 4751             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4752                 Refrescos Retornables Nuevo León    60        Esquina
## 4753                               Saladas Nuevo León    60        Esquina
## 4754             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4755                           Pastelillos Nuevo León    60        Esquina
## 4756                   Pastas de Figuritas Nuevo León    60        Esquina
## 4757                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4758                      Jugos y Néctares Nuevo León    60        Esquina
## 4759                 Refrescos Retornables Nuevo León    60        Esquina
## 4760                               Consome Nuevo León    60        Esquina
## 4761                    Barras Energéticas Nuevo León    60        Esquina
## 4762                               Saladas Nuevo León    60        Esquina
## 4763                     Refrescos en Lata Nuevo León    60        Esquina
## 4764                                 Aguas Nuevo León    60        Esquina
## 4765                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4766             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4767                 Concentrados en Polvo Nuevo León    60        Esquina
## 4768                      Jugos y Néctares Nuevo León    60        Esquina
## 4769                             Cajetilla Nuevo León    60        Esquina
## 4770                             Cajetilla Nuevo León    60        Esquina
## 4771                   Pan de Barra Blanco Nuevo León    60        Esquina
## 4772                           Sazonadores Nuevo León    60        Esquina
## 4773                         Tradicionales Nuevo León    60        Esquina
## 4774                                  Café Nuevo León    60        Esquina
## 4775                                 Leche Nuevo León    60        Esquina
## 4776             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4777             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4778                 Concentrados en Polvo Nuevo León    60        Esquina
## 4779                 Concentrados en Polvo Nuevo León    60        Esquina
## 4780                                   Sal Nuevo León    60        Esquina
## 4781                             Cajetilla Nuevo León    60        Esquina
## 4782             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4783             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4784                 Refrescos Retornables Nuevo León    60        Esquina
## 4785                      Frijoles en Lata Nuevo León    60        Esquina
## 4786             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4787                              Frituras Nuevo León    60        Esquina
## 4788             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4789             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4790                         Salsa Picante Nuevo León    60        Esquina
## 4791                                  Café Nuevo León    60        Esquina
## 4792                            Lavandería Nuevo León    60        Esquina
## 4793             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4794             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4795                               Consome Nuevo León    60        Esquina
## 4796                      Higiene Femenina Nuevo León    60        Esquina
## 4797                            Chocolates Nuevo León    60        Esquina
## 4798                   Blanqueador de Ropa Nuevo León    60        Esquina
## 4799                                  Lata Nuevo León    60        Esquina
## 4800                              Frituras Nuevo León    60        Esquina
## 4801             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4802                                 Leche Nuevo León    60        Esquina
## 4803                    Sopas Instantáneas Nuevo León    60        Esquina
## 4804             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4805             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4806             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4807             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4808             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4809               Productos sin Categoria Nuevo León    60        Esquina
## 4810                                 Aguas Nuevo León    60        Esquina
## 4811             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4812                   Blanqueador de Ropa Nuevo León    60        Esquina
## 4813                             Cajetilla Nuevo León    60        Esquina
## 4814                         Salsa Picante Nuevo León    60        Esquina
## 4815                           Empanizador Nuevo León    60        Esquina
## 4816             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4817                                 Arroz Nuevo León    60        Esquina
## 4818                           Sazonadores Nuevo León    60        Esquina
## 4819             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4820                            Malvavisco Nuevo León    60        Esquina
## 4821 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4822                                 Aguas Nuevo León    60        Esquina
## 4823                 Refrescos Retornables Nuevo León    60        Esquina
## 4824            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4825                             Cajetilla Nuevo León    60        Esquina
## 4826                             Cajetilla Nuevo León    60        Esquina
## 4827                 Refrescos Retornables Nuevo León    60        Esquina
## 4828                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4829                      Jugos y Néctares Nuevo León    60        Esquina
## 4830                 Refrescos Retornables Nuevo León    60        Esquina
## 4831                      Jugos y Néctares Nuevo León    60        Esquina
## 4832                             Cajetilla Nuevo León    60        Esquina
## 4833                 Refrescos Retornables Nuevo León    60        Esquina
## 4834                                Quesos Nuevo León    60        Esquina
## 4835                       Leches y Cremas Nuevo León    60        Esquina
## 4836             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4837                 Refrescos Retornables Nuevo León    60        Esquina
## 4838                             Cajetilla Nuevo León    60        Esquina
## 4839             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4840                      Jugos y Néctares Nuevo León    60        Esquina
## 4841                              Sandwich Nuevo León    60        Esquina
## 4842                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4843                            Lavandería Nuevo León    60        Esquina
## 4844                               Consome Nuevo León    60        Esquina
## 4845                               Consome Nuevo León    60        Esquina
## 4846                 Refrescos Retornables Nuevo León    60        Esquina
## 4847             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4848                 Refrescos Retornables Nuevo León    60        Esquina
## 4849 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4850                                Quesos Nuevo León    60        Esquina
## 4851                                Quesos Nuevo León    60        Esquina
## 4852                 Refrescos Retornables Nuevo León    60        Esquina
## 4853             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4854                              Frituras Nuevo León    60        Esquina
## 4855                               Saladas Nuevo León    60        Esquina
## 4856             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4857                           Pastelillos Nuevo León    60        Esquina
## 4858                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4859             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4860             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4861                 Concentrados en Polvo Nuevo León    60        Esquina
## 4862                              Frituras Nuevo León    60        Esquina
## 4863                      Frutas Envasadas Nuevo León    60        Esquina
## 4864                      Jugos y Néctares Nuevo León    60        Esquina
## 4865             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4866                            Chocolates Nuevo León    60        Esquina
## 4867                            Chocolates Nuevo León    60        Esquina
## 4868                    Comida para Perros Nuevo León    60        Esquina
## 4869             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4870                 Refrescos Retornables Nuevo León    60        Esquina
## 4871                              Frituras Nuevo León    60        Esquina
## 4872             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4873             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4874                 Refrescos Retornables Nuevo León    60        Esquina
## 4875 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4876                               Consome Nuevo León    60        Esquina
## 4877                 Refrescos Retornables Nuevo León    60        Esquina
## 4878                           Lavatrastes Nuevo León    60        Esquina
## 4879                            Lavandería Nuevo León    60        Esquina
## 4880                            Chocolates Nuevo León    60        Esquina
## 4881             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4882           Productos del mar Envasados Nuevo León    60        Esquina
## 4883                 Refrescos Retornables Nuevo León    60        Esquina
## 4884                          Papas Fritas Nuevo León    60        Esquina
## 4885                      Jugos y Néctares Nuevo León    60        Esquina
## 4886                 Concentrados en Polvo Nuevo León    60        Esquina
## 4887             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4888             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4889                          Papas Fritas Nuevo León    60        Esquina
## 4890             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4891                           Empanizador Nuevo León    60        Esquina
## 4892             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4893                 Refrescos Retornables Nuevo León    60        Esquina
## 4894                 Refrescos Retornables Nuevo León    60        Esquina
## 4895                              Frituras Nuevo León    60        Esquina
## 4896             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4897                                Quesos Nuevo León    60        Esquina
## 4898                                 Leche Nuevo León    60        Esquina
## 4899               Productos sin Categoria Nuevo León    60        Esquina
## 4900                 Refrescos Retornables Nuevo León    60        Esquina
## 4901                   Pan de Barra Blanco Nuevo León    60        Esquina
## 4902             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4903                                 Leche Nuevo León    60        Esquina
## 4904                              Cerillos Nuevo León    60        Esquina
## 4905             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4906                            Lavandería Nuevo León    60        Esquina
## 4907                               Consome Nuevo León    60        Esquina
## 4908             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4909                                 Aguas Nuevo León    60        Esquina
## 4910            Energizantes e Hidratantes Nuevo León    60        Esquina
## 4911                      Jugos y Néctares Nuevo León    60        Esquina
## 4912                                 Leche Nuevo León    60        Esquina
## 4913             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4914             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4915                       Papel Higiénico Nuevo León    60        Esquina
## 4916                          Pasta Dental Nuevo León    60        Esquina
## 4917                         Frijol Varios Nuevo León    60        Esquina
## 4918                  Limpiadores Líquidos Nuevo León    60        Esquina
## 4919             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4920                            Lavandería Nuevo León    60        Esquina
## 4921                 Refrescos Retornables Nuevo León    60        Esquina
## 4922                            Lavandería Nuevo León    60        Esquina
## 4923                                Quesos Nuevo León    60        Esquina
## 4924                               Saladas Nuevo León    60        Esquina
## 4925                                Quesos Nuevo León    60        Esquina
## 4926                      Leche Saborizada Nuevo León    60        Esquina
## 4927                      Jugos y Néctares Nuevo León    60        Esquina
## 4928                                 Aguas Nuevo León    60        Esquina
## 4929             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4930                 Refrescos Retornables Nuevo León    60        Esquina
## 4931                           Lavatrastes Nuevo León    60        Esquina
## 4932                 Pan de Barra Integral Nuevo León    60        Esquina
## 4933                              Papillas Nuevo León    60        Esquina
## 4934                              Papillas Nuevo León    60        Esquina
## 4935                   Limpieza de Calzado Nuevo León    60        Esquina
## 4936                                Yogurt Nuevo León    60        Esquina
## 4937                                Yogurt Nuevo León    60        Esquina
## 4938                             Cajetilla Nuevo León    60        Esquina
## 4939                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4940                               Paletas Nuevo León    60        Esquina
## 4941                                Yogurt Nuevo León    60        Esquina
## 4942             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4943                      Jugos y Néctares Nuevo León    60        Esquina
## 4944                              Frituras Nuevo León    60        Esquina
## 4945             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4946 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4947             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4948                          Papas Fritas Nuevo León    60        Esquina
## 4949                                  Lata Nuevo León    60        Esquina
## 4950             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4951                 Refrescos Retornables Nuevo León    60        Esquina
## 4952                             Cajetilla Nuevo León    60        Esquina
## 4953             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4954             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4955                             Mayonesa  Nuevo León    60        Esquina
## 4956 Pan para Hamburguesa, HotDog y Tortas Nuevo León    60        Esquina
## 4957                 Refrescos Retornables Nuevo León    60        Esquina
## 4958                   Limpieza de Calzado Nuevo León    60        Esquina
## 4959                                 Aguas Nuevo León    60        Esquina
## 4960                                Nachos Nuevo León    60        Esquina
## 4961                    Comida para Perros Nuevo León    60        Esquina
## 4962                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4963                 Pan Dulce Empaquetado Nuevo León    60        Esquina
## 4964                 Refrescos Retornables Nuevo León    60        Esquina
## 4965             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4966                                Quesos Nuevo León    60        Esquina
## 4967                 Refrescos Retornables Nuevo León    60        Esquina
## 4968                  Chicharrón de Harina Nuevo León    60        Esquina
## 4969                            Lavandería Nuevo León    60        Esquina
## 4970                                 Leche Nuevo León    60        Esquina
## 4971                              Cerillos Nuevo León    60        Esquina
## 4972                           Lavatrastes Nuevo León    60        Esquina
## 4973         Fideos, Spaguetti, Tallarines Nuevo León    60        Esquina
## 4974                               Saladas Nuevo León    60        Esquina
## 4975             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4976             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4977                          Papas Fritas Nuevo León    60        Esquina
## 4978                                Yogurt Nuevo León    60        Esquina
## 4979                 Refrescos Retornables Nuevo León    60        Esquina
## 4980                            Azucarados Nuevo León    60        Esquina
## 4981                        Leche en Polvo Nuevo León    60        Esquina
## 4982                       Gomas de Mazcar Nuevo León    60        Esquina
## 4983                              Frituras Nuevo León    60        Esquina
## 4984                              Frituras Nuevo León    60        Esquina
## 4985                 Refrescos Retornables Nuevo León    60        Esquina
## 4986                 Refrescos Retornables Nuevo León    60        Esquina
## 4987                                 Aguas Nuevo León    60        Esquina
## 4988                                Azúcar Nuevo León    60        Esquina
## 4989                            Lavandería Nuevo León    60        Esquina
## 4990                          Papas Fritas Nuevo León    60        Esquina
## 4991             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4992                                 Leche Nuevo León    60        Esquina
## 4993                             Cajetilla Nuevo León    60        Esquina
## 4994                                Quesos Nuevo León    60        Esquina
## 4995             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4996                                Quesos Nuevo León    60        Esquina
## 4997             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4998             Refrescos Plástico (N.R.) Nuevo León    60        Esquina
## 4999                 Refrescos Retornables Nuevo León    60        Esquina
##           Giro Hora.inicio Hora.cierre
## 1    Abarrotes       08:00       22:00
## 2    Abarrotes       08:00       22:00
## 3    Abarrotes       08:00       22:00
## 4    Abarrotes       08:00       22:00
## 5    Abarrotes       08:00       22:00
## 6    Abarrotes       08:00       22:00
## 7    Abarrotes       08:00       22:00
## 8    Abarrotes       08:00       22:00
## 9    Abarrotes       08:00       22:00
## 10   Abarrotes       08:00       22:00
## 11   Abarrotes       08:00       22:00
## 12   Abarrotes       08:00       22:00
## 13   Abarrotes       08:00       22:00
## 14   Abarrotes       08:00       22:00
## 15   Abarrotes       08:00       22:00
## 16   Abarrotes       08:00       22:00
## 17   Abarrotes       08:00       22:00
## 18   Abarrotes       08:00       22:00
## 19   Abarrotes       08:00       22:00
## 20   Abarrotes       08:00       22:00
## 21   Abarrotes       08:00       22:00
## 22   Abarrotes       08:00       22:00
## 23   Abarrotes       08:00       22:00
## 24   Abarrotes       08:00       22:00
## 25   Abarrotes       08:00       22:00
## 26   Abarrotes       08:00       22:00
## 27   Abarrotes       08:00       22:00
## 28   Abarrotes       08:00       22:00
## 29   Abarrotes       08:00       22:00
## 30   Abarrotes       08:00       22:00
## 31   Abarrotes       08:00       22:00
## 32   Abarrotes       08:00       22:00
## 33   Abarrotes       08:00       22:00
## 34   Abarrotes       08:00       22:00
## 35   Abarrotes       08:00       22:00
## 36   Abarrotes       08:00       22:00
## 37   Abarrotes       08:00       22:00
## 38   Abarrotes       08:00       22:00
## 39   Abarrotes       08:00       22:00
## 40   Abarrotes       08:00       22:00
## 41   Abarrotes       08:00       22:00
## 42   Abarrotes       08:00       22:00
## 43   Abarrotes       08:00       22:00
## 44   Abarrotes       08:00       22:00
## 45   Abarrotes       08:00       22:00
## 46   Abarrotes       08:00       22:00
## 47   Abarrotes       08:00       22:00
## 48   Abarrotes       08:00       22:00
## 49   Abarrotes       08:00       22:00
## 50   Abarrotes       08:00       22:00
## 51   Abarrotes       08:00       22:00
## 52   Abarrotes       08:00       22:00
## 53   Abarrotes       08:00       22:00
## 54   Abarrotes       08:00       22:00
## 55   Abarrotes       08:00       22:00
## 56   Abarrotes       08:00       22:00
## 57   Abarrotes       08:00       22:00
## 58   Abarrotes       08:00       22:00
## 59   Abarrotes       08:00       22:00
## 60   Abarrotes       08:00       22:00
## 61   Abarrotes       08:00       22:00
## 62   Abarrotes       08:00       22:00
## 63   Abarrotes       08:00       22:00
## 64   Abarrotes       08:00       22:00
## 65   Abarrotes       08:00       22:00
## 66   Abarrotes       08:00       22:00
## 67   Abarrotes       08:00       22:00
## 68   Abarrotes       08:00       22:00
## 69   Abarrotes       08:00       22:00
## 70   Abarrotes       08:00       22:00
## 71   Abarrotes       08:00       22:00
## 72   Abarrotes       08:00       22:00
## 73   Abarrotes       08:00       22:00
## 74   Abarrotes       08:00       22:00
## 75   Abarrotes       08:00       22:00
## 76   Abarrotes       08:00       22:00
## 77   Abarrotes       08:00       22:00
## 78   Abarrotes       08:00       22:00
## 79   Abarrotes       08:00       22:00
## 80   Abarrotes       08:00       22:00
## 81   Abarrotes       08:00       22:00
## 82   Abarrotes       08:00       22:00
## 83   Abarrotes       08:00       22:00
## 84   Abarrotes       08:00       22:00
## 85   Abarrotes       08:00       22:00
## 86   Abarrotes       08:00       22:00
## 87   Abarrotes       08:00       22:00
## 88   Abarrotes       08:00       22:00
## 89   Abarrotes       08:00       22:00
## 90   Abarrotes       08:00       22:00
## 91   Abarrotes       08:00       22:00
## 92   Abarrotes       08:00       22:00
## 93   Abarrotes       08:00       22:00
## 94   Abarrotes       08:00       22:00
## 95   Abarrotes       08:00       22:00
## 96   Abarrotes       08:00       22:00
## 97   Abarrotes       08:00       22:00
## 98   Abarrotes       08:00       22:00
## 99   Abarrotes       08:00       22:00
## 100  Abarrotes       08:00       22:00
## 101  Abarrotes       08:00       22:00
## 102  Abarrotes       08:00       22:00
## 103  Abarrotes       08:00       22:00
## 104  Abarrotes       08:00       22:00
## 105  Abarrotes       08:00       22:00
## 106  Abarrotes       08:00       22:00
## 107  Abarrotes       08:00       22:00
## 108  Abarrotes       08:00       22:00
## 109  Abarrotes       08:00       22:00
## 110  Abarrotes       08:00       22:00
## 111  Abarrotes       08:00       22:00
## 112  Abarrotes       08:00       22:00
## 113  Abarrotes       08:00       22:00
## 114  Abarrotes       08:00       22:00
## 115  Abarrotes       08:00       22:00
## 116  Abarrotes       08:00       22:00
## 117  Abarrotes       08:00       22:00
## 118  Abarrotes       08:00       22:00
## 119  Abarrotes       08:00       22:00
## 120  Abarrotes       08:00       22:00
## 121  Abarrotes       08:00       22:00
## 122  Abarrotes       08:00       22:00
## 123  Abarrotes       08:00       22:00
## 124  Abarrotes       08:00       22:00
## 125  Abarrotes       08:00       22:00
## 126  Abarrotes       08:00       22:00
## 127  Abarrotes       08:00       22:00
## 128  Abarrotes       08:00       22:00
## 129  Abarrotes       08:00       22:00
## 130  Abarrotes       08:00       22:00
## 131  Abarrotes       08:00       22:00
## 132  Abarrotes       08:00       22:00
## 133  Abarrotes       08:00       22:00
## 134  Abarrotes       08:00       22:00
## 135  Abarrotes       08:00       22:00
## 136  Abarrotes       08:00       22:00
## 137  Abarrotes       08:00       22:00
## 138  Abarrotes       08:00       22:00
## 139  Abarrotes       08:00       22:00
## 140  Abarrotes       08:00       22:00
## 141  Abarrotes       08:00       22:00
## 142  Abarrotes       08:00       22:00
## 143  Abarrotes       08:00       22:00
## 144  Abarrotes       08:00       22:00
## 145  Abarrotes       08:00       22:00
## 146  Abarrotes       08:00       22:00
## 147  Abarrotes       08:00       22:00
## 148  Abarrotes       08:00       22:00
## 149  Abarrotes       08:00       22:00
## 150  Abarrotes       08:00       22:00
## 151  Abarrotes       08:00       22:00
## 152  Abarrotes       08:00       22:00
## 153  Abarrotes       08:00       22:00
## 154  Abarrotes       08:00       22:00
## 155  Abarrotes       08:00       22:00
## 156  Abarrotes       08:00       22:00
## 157  Abarrotes       08:00       22:00
## 158  Abarrotes       08:00       22:00
## 159  Abarrotes       08:00       22:00
## 160  Abarrotes       08:00       22:00
## 161  Abarrotes       08:00       22:00
## 162  Abarrotes       08:00       22:00
## 163  Abarrotes       08:00       22:00
## 164  Abarrotes       08:00       22:00
## 165  Abarrotes       08:00       22:00
## 166  Abarrotes       08:00       22:00
## 167  Abarrotes       08:00       22:00
## 168  Abarrotes       08:00       22:00
## 169  Abarrotes       08:00       22:00
## 170  Abarrotes       08:00       22:00
## 171  Abarrotes       08:00       22:00
## 172  Abarrotes       08:00       22:00
## 173  Abarrotes       08:00       22:00
## 174  Abarrotes       08:00       22:00
## 175  Abarrotes       08:00       22:00
## 176  Abarrotes       08:00       22:00
## 177  Abarrotes       08:00       22:00
## 178  Abarrotes       08:00       22:00
## 179  Abarrotes       08:00       22:00
## 180  Abarrotes       08:00       22:00
## 181  Abarrotes       08:00       22:00
## 182  Abarrotes       08:00       22:00
## 183  Abarrotes       08:00       22:00
## 184  Abarrotes       08:00       22:00
## 185  Abarrotes       08:00       22:00
## 186  Abarrotes       08:00       22:00
## 187  Abarrotes       08:00       22:00
## 188  Abarrotes       08:00       22:00
## 189  Abarrotes       08:00       22:00
## 190  Abarrotes       08:00       22:00
## 191  Abarrotes       08:00       22:00
## 192  Abarrotes       08:00       22:00
## 193  Abarrotes       08:00       22:00
## 194  Abarrotes       08:00       22:00
## 195  Abarrotes       08:00       22:00
## 196  Abarrotes       08:00       22:00
## 197  Abarrotes       08:00       22:00
## 198  Abarrotes       08:00       22:00
## 199  Abarrotes       08:00       22:00
## 200  Abarrotes       08:00       22:00
## 201  Abarrotes       08:00       22:00
## 202  Abarrotes       08:00       22:00
## 203  Abarrotes       08:00       22:00
## 204  Abarrotes       08:00       22:00
## 205  Abarrotes       08:00       22:00
## 206  Abarrotes       08:00       22:00
## 207  Abarrotes       08:00       22:00
## 208  Abarrotes       08:00       22:00
## 209  Abarrotes       08:00       22:00
## 210  Abarrotes       08:00       22:00
## 211  Abarrotes       08:00       22:00
## 212  Abarrotes       08:00       22:00
## 213  Abarrotes       08:00       22:00
## 214  Abarrotes       08:00       22:00
## 215  Abarrotes       08:00       22:00
## 216  Abarrotes       08:00       22:00
## 217  Abarrotes       08:00       22:00
## 218  Abarrotes       08:00       22:00
## 219  Abarrotes       08:00       22:00
## 220  Abarrotes       08:00       22:00
## 221  Abarrotes       08:00       22:00
## 222  Abarrotes       08:00       22:00
## 223  Abarrotes       08:00       22:00
## 224  Abarrotes       08:00       22:00
## 225  Abarrotes       08:00       22:00
## 226  Abarrotes       08:00       22:00
## 227  Abarrotes       08:00       22:00
## 228  Abarrotes       08:00       22:00
## 229  Abarrotes       08:00       22:00
## 230  Abarrotes       08:00       22:00
## 231  Abarrotes       08:00       22:00
## 232  Abarrotes       08:00       22:00
## 233  Abarrotes       08:00       22:00
## 234  Abarrotes       08:00       22:00
## 235  Abarrotes       08:00       22:00
## 236  Abarrotes       08:00       22:00
## 237  Abarrotes       08:00       22:00
## 238  Abarrotes       08:00       22:00
## 239  Abarrotes       08:00       22:00
## 240  Abarrotes       08:00       22:00
## 241  Abarrotes       08:00       22:00
## 242  Abarrotes       08:00       22:00
## 243  Abarrotes       08:00       22:00
## 244  Abarrotes       08:00       22:00
## 245  Abarrotes       08:00       22:00
## 246  Abarrotes       08:00       22:00
## 247  Abarrotes       08:00       22:00
## 248  Abarrotes       08:00       22:00
## 249  Abarrotes       08:00       22:00
## 250  Abarrotes       08:00       22:00
## 251  Abarrotes       08:00       22:00
## 252  Abarrotes       08:00       22:00
## 253  Abarrotes       08:00       22:00
## 254  Abarrotes       08:00       22:00
## 255  Abarrotes       08:00       22:00
## 256  Abarrotes       08:00       22:00
## 257  Abarrotes       08:00       22:00
## 258  Abarrotes       08:00       22:00
## 259  Abarrotes       08:00       22:00
## 260  Abarrotes       08:00       22:00
## 261  Abarrotes       08:00       22:00
## 262  Abarrotes       08:00       22:00
## 263  Abarrotes       08:00       22:00
## 264  Abarrotes       08:00       22:00
## 265  Abarrotes       08:00       22:00
## 266  Abarrotes       08:00       22:00
## 267  Abarrotes       08:00       22:00
## 268  Abarrotes       08:00       22:00
## 269  Abarrotes       08:00       22:00
## 270  Abarrotes       08:00       22:00
## 271  Abarrotes       08:00       22:00
## 272  Abarrotes       08:00       22:00
## 273  Abarrotes       08:00       22:00
## 274  Abarrotes       08:00       22:00
## 275  Abarrotes       08:00       22:00
## 276  Abarrotes       08:00       22:00
## 277  Abarrotes       08:00       22:00
## 278  Abarrotes       08:00       22:00
## 279  Abarrotes       08:00       22:00
## 280  Abarrotes       08:00       22:00
## 281  Abarrotes       08:00       22:00
## 282  Abarrotes       08:00       22:00
## 283  Abarrotes       08:00       22:00
## 284  Abarrotes       08:00       22:00
## 285  Abarrotes       08:00       22:00
## 286  Abarrotes       08:00       22:00
## 287  Abarrotes       08:00       22:00
## 288  Abarrotes       08:00       22:00
## 289  Abarrotes       08:00       22:00
## 290  Abarrotes       08:00       22:00
## 291  Abarrotes       08:00       22:00
## 292  Abarrotes       08:00       22:00
## 293  Abarrotes       08:00       22:00
## 294  Abarrotes       08:00       22:00
## 295  Abarrotes       08:00       22:00
## 296  Abarrotes       08:00       22:00
## 297  Abarrotes       08:00       22:00
## 298  Abarrotes       08:00       22:00
## 299  Abarrotes       08:00       22:00
## 300  Abarrotes       08:00       22:00
## 301  Abarrotes       08:00       22:00
## 302  Abarrotes       08:00       22:00
## 303  Abarrotes       08:00       22:00
## 304  Abarrotes       08:00       22:00
## 305  Abarrotes       08:00       22:00
## 306  Abarrotes       08:00       22:00
## 307  Abarrotes       08:00       22:00
## 308  Abarrotes       08:00       22:00
## 309  Abarrotes       08:00       22:00
## 310  Abarrotes       08:00       22:00
## 311  Abarrotes       08:00       22:00
## 312  Abarrotes       08:00       22:00
## 313  Abarrotes       08:00       22:00
## 314  Abarrotes       08:00       22:00
## 315  Abarrotes       08:00       22:00
## 316  Abarrotes       08:00       22:00
## 317  Abarrotes       08:00       22:00
## 318  Abarrotes       08:00       22:00
## 319  Abarrotes       08:00       22:00
## 320  Abarrotes       08:00       22:00
## 321  Abarrotes       08:00       22:00
## 322  Abarrotes       08:00       22:00
## 323  Abarrotes       08:00       22:00
## 324  Abarrotes       08:00       22:00
## 325  Abarrotes       08:00       22:00
## 326  Abarrotes       08:00       22:00
## 327  Abarrotes       08:00       22:00
## 328  Abarrotes       08:00       22:00
## 329  Abarrotes       08:00       22:00
## 330  Abarrotes       08:00       22:00
## 331  Abarrotes       08:00       22:00
## 332  Abarrotes       08:00       22:00
## 333  Abarrotes       08:00       22:00
## 334  Abarrotes       08:00       22:00
## 335  Abarrotes       08:00       22:00
## 336  Abarrotes       08:00       22:00
## 337  Abarrotes       08:00       22:00
## 338  Abarrotes       08:00       22:00
## 339  Abarrotes       08:00       22:00
## 340  Abarrotes       08:00       22:00
## 341  Abarrotes       08:00       22:00
## 342  Abarrotes       08:00       22:00
## 343  Abarrotes       08:00       22:00
## 344  Abarrotes       08:00       22:00
## 345  Abarrotes       08:00       22:00
## 346  Abarrotes       08:00       22:00
## 347  Abarrotes       08:00       22:00
## 348  Abarrotes       08:00       22:00
## 349  Abarrotes       08:00       22:00
## 350  Abarrotes       08:00       22:00
## 351  Abarrotes       08:00       22:00
## 352  Abarrotes       08:00       22:00
## 353  Abarrotes       08:00       22:00
## 354  Abarrotes       08:00       22:00
## 355  Abarrotes       08:00       22:00
## 356  Abarrotes       08:00       22:00
## 357  Abarrotes       08:00       22:00
## 358  Abarrotes       08:00       22:00
## 359  Abarrotes       08:00       22:00
## 360  Abarrotes       08:00       22:00
## 361  Abarrotes       08:00       22:00
## 362  Abarrotes       08:00       22:00
## 363  Abarrotes       08:00       22:00
## 364  Abarrotes       08:00       22:00
## 365  Abarrotes       08:00       22:00
## 366  Abarrotes       08:00       22:00
## 367  Abarrotes       08:00       22:00
## 368  Abarrotes       08:00       22:00
## 369  Abarrotes       08:00       22:00
## 370  Abarrotes       08:00       22:00
## 371  Abarrotes       08:00       22:00
## 372  Abarrotes       08:00       22:00
## 373  Abarrotes       08:00       22:00
## 374  Abarrotes       08:00       22:00
## 375  Abarrotes       08:00       22:00
## 376  Abarrotes       08:00       22:00
## 377  Abarrotes       08:00       22:00
## 378  Abarrotes       08:00       22:00
## 379  Abarrotes       08:00       22:00
## 380  Abarrotes       08:00       22:00
## 381  Abarrotes       08:00       22:00
## 382  Abarrotes       08:00       22:00
## 383  Abarrotes       08:00       22:00
## 384  Abarrotes       08:00       22:00
## 385  Abarrotes       08:00       22:00
## 386  Abarrotes       08:00       22:00
## 387  Abarrotes       08:00       22:00
## 388  Abarrotes       08:00       22:00
## 389  Abarrotes       08:00       22:00
## 390  Abarrotes       08:00       22:00
## 391  Abarrotes       08:00       22:00
## 392  Abarrotes       08:00       22:00
## 393  Abarrotes       08:00       22:00
## 394  Abarrotes       08:00       22:00
## 395  Abarrotes       08:00       22:00
## 396  Abarrotes       08:00       22:00
## 397  Abarrotes       08:00       22:00
## 398  Abarrotes       08:00       22:00
## 399  Abarrotes       08:00       22:00
## 400  Abarrotes       08:00       22:00
## 401  Abarrotes       08:00       22:00
## 402  Abarrotes       08:00       22:00
## 403  Abarrotes       08:00       22:00
## 404  Abarrotes       08:00       22:00
## 405  Abarrotes       08:00       22:00
## 406  Abarrotes       08:00       22:00
## 407  Abarrotes       08:00       22:00
## 408  Abarrotes       08:00       22:00
## 409  Abarrotes       08:00       22:00
## 410  Abarrotes       08:00       22:00
## 411  Abarrotes       08:00       22:00
## 412  Abarrotes       08:00       22:00
## 413  Abarrotes       08:00       22:00
## 414  Abarrotes       08:00       22:00
## 415  Abarrotes       08:00       22:00
## 416  Abarrotes       08:00       22:00
## 417  Abarrotes       08:00       22:00
## 418  Abarrotes       08:00       22:00
## 419  Abarrotes       08:00       22:00
## 420  Abarrotes       08:00       22:00
## 421  Abarrotes       08:00       22:00
## 422  Abarrotes       08:00       22:00
## 423  Abarrotes       08:00       22:00
## 424  Abarrotes       08:00       22:00
## 425  Abarrotes       08:00       22:00
## 426  Abarrotes       08:00       22:00
## 427  Abarrotes       08:00       22:00
## 428  Abarrotes       08:00       22:00
## 429  Abarrotes       08:00       22:00
## 430  Abarrotes       08:00       22:00
## 431  Abarrotes       08:00       22:00
## 432  Abarrotes       08:00       22:00
## 433  Abarrotes       08:00       22:00
## 434  Abarrotes       08:00       22:00
## 435  Abarrotes       08:00       22:00
## 436  Abarrotes       08:00       22:00
## 437  Abarrotes       08:00       22:00
## 438  Abarrotes       08:00       22:00
## 439  Abarrotes       08:00       22:00
## 440  Abarrotes       08:00       22:00
## 441  Abarrotes       08:00       22:00
## 442  Abarrotes       08:00       22:00
## 443  Abarrotes       08:00       22:00
## 444  Abarrotes       08:00       22:00
## 445  Abarrotes       08:00       22:00
## 446  Abarrotes       08:00       22:00
## 447  Abarrotes       08:00       22:00
## 448  Abarrotes       08:00       22:00
## 449  Abarrotes       08:00       22:00
## 450  Abarrotes       08:00       22:00
## 451  Abarrotes       08:00       22:00
## 452  Abarrotes       08:00       22:00
## 453  Abarrotes       08:00       22:00
## 454  Abarrotes       08:00       22:00
## 455  Abarrotes       08:00       22:00
## 456  Abarrotes       08:00       22:00
## 457  Abarrotes       08:00       22:00
## 458  Abarrotes       08:00       22:00
## 459  Abarrotes       08:00       22:00
## 460  Abarrotes       08:00       22:00
## 461  Abarrotes       08:00       22:00
## 462  Abarrotes       08:00       22:00
## 463  Abarrotes       08:00       22:00
## 464  Abarrotes       08:00       22:00
## 465  Abarrotes       08:00       22:00
## 466  Abarrotes       08:00       22:00
## 467  Abarrotes       08:00       22:00
## 468  Abarrotes       08:00       22:00
## 469  Abarrotes       08:00       22:00
## 470  Abarrotes       08:00       22:00
## 471  Abarrotes       08:00       22:00
## 472  Abarrotes       08:00       22:00
## 473  Abarrotes       08:00       22:00
## 474  Abarrotes       08:00       22:00
## 475  Abarrotes       08:00       22:00
## 476  Abarrotes       08:00       22:00
## 477  Abarrotes       08:00       22:00
## 478  Abarrotes       08:00       22:00
## 479  Abarrotes       08:00       22:00
## 480  Abarrotes       08:00       22:00
## 481  Abarrotes       08:00       22:00
## 482  Abarrotes       08:00       22:00
## 483  Abarrotes       08:00       22:00
## 484  Abarrotes       08:00       22:00
## 485  Abarrotes       08:00       22:00
## 486  Abarrotes       08:00       22:00
## 487  Abarrotes       08:00       22:00
## 488  Abarrotes       08:00       22:00
## 489  Abarrotes       08:00       22:00
## 490  Abarrotes       08:00       22:00
## 491  Abarrotes       08:00       22:00
## 492  Abarrotes       08:00       22:00
## 493  Abarrotes       08:00       22:00
## 494  Abarrotes       08:00       22:00
## 495  Abarrotes       08:00       22:00
## 496  Abarrotes       08:00       22:00
## 497  Abarrotes       08:00       22:00
## 498  Abarrotes       08:00       22:00
## 499  Abarrotes       08:00       22:00
## 500  Abarrotes       08:00       22:00
## 501  Abarrotes       08:00       22:00
## 502  Abarrotes       08:00       22:00
## 503  Abarrotes       08:00       22:00
## 504  Abarrotes       08:00       22:00
## 505  Abarrotes       08:00       22:00
## 506  Abarrotes       08:00       22:00
## 507  Abarrotes       08:00       22:00
## 508  Abarrotes       08:00       22:00
## 509  Abarrotes       08:00       22:00
## 510  Abarrotes       08:00       22:00
## 511  Abarrotes       08:00       22:00
## 512  Abarrotes       08:00       22:00
## 513  Abarrotes       08:00       22:00
## 514  Abarrotes       08:00       22:00
## 515  Abarrotes       08:00       22:00
## 516  Abarrotes       08:00       22:00
## 517  Abarrotes       08:00       22:00
## 518  Abarrotes       08:00       22:00
## 519  Abarrotes       08:00       22:00
## 520  Abarrotes       08:00       22:00
## 521  Abarrotes       08:00       22:00
## 522  Abarrotes       08:00       22:00
## 523  Abarrotes       08:00       22:00
## 524  Abarrotes       08:00       22:00
## 525  Abarrotes       08:00       22:00
## 526  Abarrotes       08:00       22:00
## 527  Abarrotes       08:00       22:00
## 528  Abarrotes       08:00       22:00
## 529  Abarrotes       08:00       22:00
## 530  Abarrotes       08:00       22:00
## 531  Abarrotes       08:00       22:00
## 532  Abarrotes       08:00       22:00
## 533  Abarrotes       08:00       22:00
## 534  Abarrotes       08:00       22:00
## 535  Abarrotes       08:00       22:00
## 536  Abarrotes       08:00       22:00
## 537  Abarrotes       08:00       22:00
## 538  Abarrotes       08:00       22:00
## 539  Abarrotes       08:00       22:00
## 540  Abarrotes       08:00       22:00
## 541  Abarrotes       08:00       22:00
## 542  Abarrotes       08:00       22:00
## 543  Abarrotes       08:00       22:00
## 544  Abarrotes       08:00       22:00
## 545  Abarrotes       08:00       22:00
## 546  Abarrotes       08:00       22:00
## 547  Abarrotes       08:00       22:00
## 548  Abarrotes       08:00       22:00
## 549  Abarrotes       08:00       22:00
## 550  Abarrotes       08:00       22:00
## 551  Abarrotes       08:00       22:00
## 552  Abarrotes       08:00       22:00
## 553  Abarrotes       08:00       22:00
## 554  Abarrotes       08:00       22:00
## 555  Abarrotes       08:00       22:00
## 556  Abarrotes       08:00       22:00
## 557  Abarrotes       08:00       22:00
## 558  Abarrotes       08:00       22:00
## 559  Abarrotes       08:00       22:00
## 560  Abarrotes       08:00       22:00
## 561  Abarrotes       08:00       22:00
## 562  Abarrotes       08:00       22:00
## 563  Abarrotes       08:00       22:00
## 564  Abarrotes       08:00       22:00
## 565  Abarrotes       08:00       22:00
## 566  Abarrotes       08:00       22:00
## 567  Abarrotes       08:00       22:00
## 568  Abarrotes       08:00       22:00
## 569  Abarrotes       08:00       22:00
## 570  Abarrotes       08:00       22:00
## 571  Abarrotes       08:00       22:00
## 572  Abarrotes       08:00       22:00
## 573  Abarrotes       08:00       22:00
## 574  Abarrotes       08:00       22:00
## 575  Abarrotes       08:00       22:00
## 576  Abarrotes       08:00       22:00
## 577  Abarrotes       08:00       22:00
## 578  Abarrotes       08:00       22:00
## 579  Abarrotes       08:00       22:00
## 580  Abarrotes       08:00       22:00
## 581  Abarrotes       08:00       22:00
## 582  Abarrotes       08:00       22:00
## 583  Abarrotes       08:00       22:00
## 584  Abarrotes       08:00       22:00
## 585  Abarrotes       08:00       22:00
## 586  Abarrotes       08:00       22:00
## 587  Abarrotes       08:00       22:00
## 588  Abarrotes       08:00       22:00
## 589  Abarrotes       08:00       22:00
## 590  Abarrotes       08:00       22:00
## 591  Abarrotes       08:00       22:00
## 592  Abarrotes       08:00       22:00
## 593  Abarrotes       08:00       22:00
## 594  Abarrotes       08:00       22:00
## 595  Abarrotes       08:00       22:00
## 596  Abarrotes       08:00       22:00
## 597  Abarrotes       08:00       22:00
## 598  Abarrotes       08:00       22:00
## 599  Abarrotes       08:00       22:00
## 600  Abarrotes       08:00       22:00
## 601  Abarrotes       08:00       22:00
## 602  Abarrotes       08:00       22:00
## 603  Abarrotes       08:00       22:00
## 604  Abarrotes       08:00       22:00
## 605  Abarrotes       08:00       22:00
## 606  Abarrotes       08:00       22:00
## 607  Abarrotes       08:00       22:00
## 608  Abarrotes       08:00       22:00
## 609  Abarrotes       08:00       22:00
## 610  Abarrotes       08:00       22:00
## 611  Abarrotes       08:00       22:00
## 612  Abarrotes       08:00       22:00
## 613  Abarrotes       08:00       22:00
## 614  Abarrotes       08:00       22:00
## 615  Abarrotes       08:00       22:00
## 616  Abarrotes       08:00       22:00
## 617  Abarrotes       08:00       22:00
## 618  Abarrotes       08:00       22:00
## 619  Abarrotes       08:00       22:00
## 620  Abarrotes       08:00       22:00
## 621  Abarrotes       08:00       22:00
## 622  Abarrotes       08:00       22:00
## 623  Abarrotes       08:00       22:00
## 624  Abarrotes       08:00       22:00
## 625  Abarrotes       08:00       22:00
## 626  Abarrotes       08:00       22:00
## 627  Abarrotes       08:00       22:00
## 628  Abarrotes       08:00       22:00
## 629  Abarrotes       08:00       22:00
## 630  Abarrotes       08:00       22:00
## 631  Abarrotes       08:00       22:00
## 632  Abarrotes       08:00       22:00
## 633  Abarrotes       08:00       22:00
## 634  Abarrotes       08:00       22:00
## 635  Abarrotes       08:00       22:00
## 636  Abarrotes       08:00       22:00
## 637  Abarrotes       08:00       22:00
## 638  Abarrotes       08:00       22:00
## 639  Abarrotes       08:00       22:00
## 640  Abarrotes       08:00       22:00
## 641  Abarrotes       08:00       22:00
## 642  Abarrotes       08:00       22:00
## 643  Abarrotes       08:00       22:00
## 644  Abarrotes       08:00       22:00
## 645  Abarrotes       08:00       22:00
## 646  Abarrotes       08:00       22:00
## 647  Abarrotes       08:00       22:00
## 648  Abarrotes       08:00       22:00
## 649  Abarrotes       08:00       22:00
## 650  Abarrotes       08:00       22:00
## 651  Abarrotes       08:00       22:00
## 652  Abarrotes       08:00       22:00
## 653  Abarrotes       08:00       22:00
## 654  Abarrotes       08:00       22:00
## 655  Abarrotes       08:00       22:00
## 656  Abarrotes       08:00       22:00
## 657  Abarrotes       08:00       22:00
## 658  Abarrotes       08:00       22:00
## 659  Abarrotes       08:00       22:00
## 660  Abarrotes       08:00       22:00
## 661  Abarrotes       08:00       22:00
## 662  Abarrotes       08:00       22:00
## 663  Abarrotes       08:00       22:00
## 664  Abarrotes       08:00       22:00
## 665  Abarrotes       08:00       22:00
## 666  Abarrotes       08:00       22:00
## 667  Abarrotes       08:00       22:00
## 668  Abarrotes       08:00       22:00
## 669  Abarrotes       08:00       22:00
## 670  Abarrotes       08:00       22:00
## 671  Abarrotes       08:00       22:00
## 672  Abarrotes       08:00       22:00
## 673  Abarrotes       08:00       22:00
## 674  Abarrotes       08:00       22:00
## 675  Abarrotes       08:00       22:00
## 676  Abarrotes       08:00       22:00
## 677  Abarrotes       08:00       22:00
## 678  Abarrotes       08:00       22:00
## 679  Abarrotes       08:00       22:00
## 680  Abarrotes       08:00       22:00
## 681  Abarrotes       08:00       22:00
## 682  Abarrotes       08:00       22:00
## 683  Abarrotes       08:00       22:00
## 684  Abarrotes       08:00       22:00
## 685  Abarrotes       08:00       22:00
## 686  Abarrotes       08:00       22:00
## 687  Abarrotes       08:00       22:00
## 688  Abarrotes       08:00       22:00
## 689  Abarrotes       08:00       22:00
## 690  Abarrotes       08:00       22:00
## 691  Abarrotes       08:00       22:00
## 692  Abarrotes       08:00       22:00
## 693  Abarrotes       08:00       22:00
## 694  Abarrotes       08:00       22:00
## 695  Abarrotes       08:00       22:00
## 696  Abarrotes       08:00       22:00
## 697  Abarrotes       08:00       22:00
## 698  Abarrotes       08:00       22:00
## 699  Abarrotes       08:00       22:00
## 700  Abarrotes       08:00       22:00
## 701  Abarrotes       08:00       22:00
## 702  Abarrotes       08:00       22:00
## 703  Abarrotes       08:00       22:00
## 704  Abarrotes       08:00       22:00
## 705  Abarrotes       08:00       22:00
## 706  Abarrotes       08:00       22:00
## 707  Abarrotes       08:00       22:00
## 708  Abarrotes       08:00       22:00
## 709  Abarrotes       08:00       22:00
## 710  Abarrotes       08:00       22:00
## 711  Abarrotes       08:00       22:00
## 712  Abarrotes       08:00       22:00
## 713  Abarrotes       08:00       22:00
## 714  Abarrotes       08:00       22:00
## 715  Abarrotes       08:00       22:00
## 716  Abarrotes       08:00       22:00
## 717  Abarrotes       08:00       22:00
## 718  Abarrotes       08:00       22:00
## 719  Abarrotes       08:00       22:00
## 720  Abarrotes       08:00       22:00
## 721  Abarrotes       08:00       22:00
## 722  Abarrotes       08:00       22:00
## 723  Abarrotes       08:00       22:00
## 724  Abarrotes       08:00       22:00
## 725  Abarrotes       08:00       22:00
## 726  Abarrotes       08:00       22:00
## 727  Abarrotes       08:00       22:00
## 728  Abarrotes       08:00       22:00
## 729  Abarrotes       08:00       22:00
## 730  Abarrotes       08:00       22:00
## 731  Abarrotes       08:00       22:00
## 732  Abarrotes       08:00       22:00
## 733  Abarrotes       08:00       22:00
## 734  Abarrotes       08:00       22:00
## 735  Abarrotes       08:00       22:00
## 736  Abarrotes       08:00       22:00
## 737  Abarrotes       08:00       22:00
## 738  Abarrotes       08:00       22:00
## 739  Abarrotes       08:00       22:00
## 740  Abarrotes       08:00       22:00
## 741  Abarrotes       08:00       22:00
## 742  Abarrotes       08:00       22:00
## 743  Abarrotes       08:00       22:00
## 744  Abarrotes       08:00       22:00
## 745  Abarrotes       08:00       22:00
## 746  Abarrotes       08:00       22:00
## 747  Abarrotes       08:00       22:00
## 748  Abarrotes       08:00       22:00
## 749  Abarrotes       08:00       22:00
## 750  Abarrotes       08:00       22:00
## 751  Abarrotes       08:00       22:00
## 752  Abarrotes       08:00       22:00
## 753  Abarrotes       08:00       22:00
## 754  Abarrotes       08:00       22:00
## 755  Abarrotes       08:00       22:00
## 756  Abarrotes       08:00       22:00
## 757  Abarrotes       08:00       22:00
## 758  Abarrotes       08:00       22:00
## 759  Abarrotes       08:00       22:00
## 760  Abarrotes       08:00       22:00
## 761  Abarrotes       08:00       22:00
## 762  Abarrotes       08:00       22:00
## 763  Abarrotes       08:00       22:00
## 764  Abarrotes       08:00       22:00
## 765  Abarrotes       08:00       22:00
## 766  Abarrotes       08:00       22:00
## 767  Abarrotes       08:00       22:00
## 768  Abarrotes       08:00       22:00
## 769  Abarrotes       08:00       22:00
## 770  Abarrotes       08:00       22:00
## 771  Abarrotes       08:00       22:00
## 772  Abarrotes       08:00       22:00
## 773  Abarrotes       08:00       22:00
## 774  Abarrotes       08:00       22:00
## 775  Abarrotes       08:00       22:00
## 776  Abarrotes       08:00       22:00
## 777  Abarrotes       08:00       22:00
## 778  Abarrotes       08:00       22:00
## 779  Abarrotes       08:00       22:00
## 780  Abarrotes       08:00       22:00
## 781  Abarrotes       08:00       22:00
## 782  Abarrotes       08:00       22:00
## 783  Abarrotes       08:00       22:00
## 784  Abarrotes       08:00       22:00
## 785  Abarrotes       08:00       22:00
## 786  Abarrotes       08:00       22:00
## 787  Abarrotes       08:00       22:00
## 788  Abarrotes       08:00       22:00
## 789  Abarrotes       08:00       22:00
## 790  Abarrotes       08:00       22:00
## 791  Abarrotes       08:00       22:00
## 792  Abarrotes       08:00       22:00
## 793  Abarrotes       08:00       22:00
## 794  Abarrotes       08:00       22:00
## 795  Abarrotes       08:00       22:00
## 796  Abarrotes       08:00       22:00
## 797  Abarrotes       08:00       22:00
## 798  Abarrotes       08:00       22:00
## 799  Abarrotes       08:00       22:00
## 800  Abarrotes       08:00       22:00
## 801  Abarrotes       08:00       22:00
## 802  Abarrotes       08:00       22:00
## 803  Abarrotes       08:00       22:00
## 804  Abarrotes       08:00       22:00
## 805  Abarrotes       08:00       22:00
## 806  Abarrotes       08:00       22:00
## 807  Abarrotes       08:00       22:00
## 808  Abarrotes       08:00       22:00
## 809  Abarrotes       08:00       22:00
## 810  Abarrotes       08:00       22:00
## 811  Abarrotes       08:00       22:00
## 812  Abarrotes       08:00       22:00
## 813  Abarrotes       08:00       22:00
## 814  Abarrotes       08:00       22:00
## 815  Abarrotes       08:00       22:00
## 816  Abarrotes       08:00       22:00
## 817  Abarrotes       08:00       22:00
## 818  Abarrotes       08:00       22:00
## 819  Abarrotes       08:00       22:00
## 820  Abarrotes       08:00       22:00
## 821  Abarrotes       08:00       22:00
## 822  Abarrotes       08:00       22:00
## 823  Abarrotes       08:00       22:00
## 824  Abarrotes       08:00       22:00
## 825  Abarrotes       08:00       22:00
## 826  Abarrotes       08:00       22:00
## 827  Abarrotes       08:00       22:00
## 828  Abarrotes       08:00       22:00
## 829  Abarrotes       08:00       22:00
## 830  Abarrotes       08:00       22:00
## 831  Abarrotes       08:00       22:00
## 832  Abarrotes       08:00       22:00
## 833  Abarrotes       08:00       22:00
## 834  Abarrotes       08:00       22:00
## 835  Abarrotes       08:00       22:00
## 836  Abarrotes       08:00       22:00
## 837  Abarrotes       08:00       22:00
## 838  Abarrotes       08:00       22:00
## 839  Abarrotes       08:00       22:00
## 840  Abarrotes       08:00       22:00
## 841  Abarrotes       08:00       22:00
## 842  Abarrotes       08:00       22:00
## 843  Abarrotes       08:00       22:00
## 844  Abarrotes       08:00       22:00
## 845  Abarrotes       08:00       22:00
## 846  Abarrotes       08:00       22:00
## 847  Abarrotes       08:00       22:00
## 848  Abarrotes       08:00       22:00
## 849  Abarrotes       08:00       22:00
## 850  Abarrotes       08:00       22:00
## 851  Abarrotes       08:00       22:00
## 852  Abarrotes       08:00       22:00
## 853  Abarrotes       08:00       22:00
## 854  Abarrotes       08:00       22:00
## 855  Abarrotes       08:00       22:00
## 856  Abarrotes       08:00       22:00
## 857  Abarrotes       08:00       22:00
## 858  Abarrotes       08:00       22:00
## 859  Abarrotes       08:00       22:00
## 860  Abarrotes       08:00       22:00
## 861  Abarrotes       08:00       22:00
## 862  Abarrotes       08:00       22:00
## 863  Abarrotes       08:00       22:00
## 864  Abarrotes       08:00       22:00
## 865  Abarrotes       08:00       22:00
## 866  Abarrotes       08:00       22:00
## 867  Abarrotes       08:00       22:00
## 868  Abarrotes       08:00       22:00
## 869  Abarrotes       08:00       22:00
## 870  Abarrotes       08:00       22:00
## 871  Abarrotes       08:00       22:00
## 872  Abarrotes       08:00       22:00
## 873  Abarrotes       08:00       22:00
## 874  Abarrotes       08:00       22:00
## 875  Abarrotes       08:00       22:00
## 876  Abarrotes       08:00       22:00
## 877  Abarrotes       08:00       22:00
## 878  Abarrotes       08:00       22:00
## 879  Abarrotes       08:00       22:00
## 880  Abarrotes       08:00       22:00
## 881  Abarrotes       08:00       22:00
## 882  Abarrotes       08:00       22:00
## 883  Abarrotes       08:00       22:00
## 884  Abarrotes       08:00       22:00
## 885  Abarrotes       08:00       22:00
## 886  Abarrotes       08:00       22:00
## 887  Abarrotes       08:00       22:00
## 888  Abarrotes       08:00       22:00
## 889  Abarrotes       08:00       22:00
## 890  Abarrotes       08:00       22:00
## 891  Abarrotes       08:00       22:00
## 892  Abarrotes       08:00       22:00
## 893  Abarrotes       08:00       22:00
## 894  Abarrotes       08:00       22:00
## 895  Abarrotes       08:00       22:00
## 896  Abarrotes       08:00       22:00
## 897  Abarrotes       08:00       22:00
## 898  Abarrotes       08:00       22:00
## 899  Abarrotes       08:00       22:00
## 900  Abarrotes       08:00       22:00
## 901  Abarrotes       08:00       22:00
## 902  Abarrotes       08:00       22:00
## 903  Abarrotes       08:00       22:00
## 904  Abarrotes       08:00       22:00
## 905  Abarrotes       08:00       22:00
## 906  Abarrotes       08:00       22:00
## 907  Abarrotes       08:00       22:00
## 908  Abarrotes       08:00       22:00
## 909  Abarrotes       08:00       22:00
## 910  Abarrotes       08:00       22:00
## 911  Abarrotes       08:00       22:00
## 912  Abarrotes       08:00       22:00
## 913  Abarrotes       08:00       22:00
## 914  Abarrotes       08:00       22:00
## 915  Abarrotes       08:00       22:00
## 916  Abarrotes       08:00       22:00
## 917  Abarrotes       08:00       22:00
## 918  Abarrotes       08:00       22:00
## 919  Abarrotes       08:00       22:00
## 920  Abarrotes       08:00       22:00
## 921  Abarrotes       08:00       22:00
## 922  Abarrotes       08:00       22:00
## 923  Abarrotes       08:00       22:00
## 924  Abarrotes       08:00       22:00
## 925  Abarrotes       08:00       22:00
## 926  Abarrotes       08:00       22:00
## 927  Abarrotes       08:00       22:00
## 928  Abarrotes       08:00       22:00
## 929  Abarrotes       08:00       22:00
## 930  Abarrotes       08:00       22:00
## 931  Abarrotes       08:00       22:00
## 932  Abarrotes       08:00       22:00
## 933  Abarrotes       08:00       22:00
## 934  Abarrotes       08:00       22:00
## 935  Abarrotes       08:00       22:00
## 936  Abarrotes       08:00       22:00
## 937  Abarrotes       08:00       22:00
## 938  Abarrotes       08:00       22:00
## 939  Abarrotes       08:00       22:00
## 940  Abarrotes       08:00       22:00
## 941  Abarrotes       08:00       22:00
## 942  Abarrotes       08:00       22:00
## 943  Abarrotes       08:00       22:00
## 944  Abarrotes       08:00       22:00
## 945  Abarrotes       08:00       22:00
## 946  Abarrotes       08:00       22:00
## 947  Abarrotes       08:00       22:00
## 948  Abarrotes       08:00       22:00
## 949  Abarrotes       08:00       22:00
## 950  Abarrotes       08:00       22:00
## 951  Abarrotes       08:00       22:00
## 952  Abarrotes       08:00       22:00
## 953  Abarrotes       08:00       22:00
## 954  Abarrotes       08:00       22:00
## 955  Abarrotes       08:00       22:00
## 956  Abarrotes       08:00       22:00
## 957  Abarrotes       08:00       22:00
## 958  Abarrotes       08:00       22:00
## 959  Abarrotes       08:00       22:00
## 960  Abarrotes       08:00       22:00
## 961  Abarrotes       08:00       22:00
## 962  Abarrotes       08:00       22:00
## 963  Abarrotes       08:00       22:00
## 964  Abarrotes       08:00       22:00
## 965  Abarrotes       08:00       22:00
## 966  Abarrotes       08:00       22:00
## 967  Abarrotes       08:00       22:00
## 968  Abarrotes       08:00       22:00
## 969  Abarrotes       08:00       22:00
## 970  Abarrotes       08:00       22:00
## 971  Abarrotes       08:00       22:00
## 972  Abarrotes       08:00       22:00
## 973  Abarrotes       08:00       22:00
## 974  Abarrotes       08:00       22:00
## 975  Abarrotes       08:00       22:00
## 976  Abarrotes       08:00       22:00
## 977  Abarrotes       08:00       22:00
## 978  Abarrotes       08:00       22:00
## 979  Abarrotes       08:00       22:00
## 980  Abarrotes       08:00       22:00
## 981  Abarrotes       08:00       22:00
## 982  Abarrotes       08:00       22:00
## 983  Abarrotes       08:00       22:00
## 984  Abarrotes       08:00       22:00
## 985  Abarrotes       08:00       22:00
## 986  Abarrotes       08:00       22:00
## 987  Abarrotes       08:00       22:00
## 988  Abarrotes       08:00       22:00
## 989  Abarrotes       08:00       22:00
## 990  Abarrotes       08:00       22:00
## 991  Abarrotes       08:00       22:00
## 992  Abarrotes       08:00       22:00
## 993  Abarrotes       08:00       22:00
## 994  Abarrotes       08:00       22:00
## 995  Abarrotes       08:00       22:00
## 996  Abarrotes       08:00       22:00
## 997  Abarrotes       08:00       22:00
## 998  Abarrotes       08:00       22:00
## 999  Abarrotes       08:00       22:00
## 1000 Abarrotes       08:00       22:00
## 1001 Abarrotes       08:00       22:00
## 1002 Abarrotes       08:00       22:00
## 1003 Abarrotes       08:00       22:00
## 1004 Abarrotes       08:00       22:00
## 1005 Abarrotes       08:00       22:00
## 1006 Abarrotes       08:00       22:00
## 1007 Abarrotes       08:00       22:00
## 1008 Abarrotes       08:00       22:00
## 1009 Abarrotes       08:00       22:00
## 1010 Abarrotes       08:00       22:00
## 1011 Abarrotes       08:00       22:00
## 1012 Abarrotes       08:00       22:00
## 1013 Abarrotes       08:00       22:00
## 1014 Abarrotes       08:00       22:00
## 1015 Abarrotes       08:00       22:00
## 1016 Abarrotes       08:00       22:00
## 1017 Abarrotes       08:00       22:00
## 1018 Abarrotes       08:00       22:00
## 1019 Abarrotes       08:00       22:00
## 1020 Abarrotes       08:00       22:00
## 1021 Abarrotes       08:00       22:00
## 1022 Abarrotes       08:00       22:00
## 1023 Abarrotes       08:00       22:00
## 1024 Abarrotes       08:00       22:00
## 1025 Abarrotes       08:00       22:00
## 1026 Abarrotes       08:00       22:00
## 1027 Abarrotes       08:00       22:00
## 1028 Abarrotes       08:00       22:00
## 1029 Abarrotes       08:00       22:00
## 1030 Abarrotes       08:00       22:00
## 1031 Abarrotes       08:00       22:00
## 1032 Abarrotes       08:00       22:00
## 1033 Abarrotes       08:00       22:00
## 1034 Abarrotes       08:00       22:00
## 1035 Abarrotes       08:00       22:00
## 1036 Abarrotes       08:00       22:00
## 1037 Abarrotes       08:00       22:00
## 1038 Abarrotes       08:00       22:00
## 1039 Abarrotes       08:00       22:00
## 1040 Abarrotes       08:00       22:00
## 1041 Abarrotes       08:00       22:00
## 1042 Abarrotes       08:00       22:00
## 1043 Abarrotes       08:00       22:00
## 1044 Abarrotes       08:00       22:00
## 1045 Abarrotes       08:00       22:00
## 1046 Abarrotes       08:00       22:00
## 1047 Abarrotes       08:00       22:00
## 1048 Abarrotes       08:00       22:00
## 1049 Abarrotes       08:00       22:00
## 1050 Abarrotes       08:00       22:00
## 1051 Abarrotes       08:00       22:00
## 1052 Abarrotes       08:00       22:00
## 1053 Abarrotes       08:00       22:00
## 1054 Abarrotes       08:00       22:00
## 1055 Abarrotes       08:00       22:00
## 1056 Abarrotes       08:00       22:00
## 1057 Abarrotes       08:00       22:00
## 1058 Abarrotes       08:00       22:00
## 1059 Abarrotes       08:00       22:00
## 1060 Abarrotes       08:00       22:00
## 1061 Abarrotes       08:00       22:00
## 1062 Abarrotes       08:00       22:00
## 1063 Abarrotes       08:00       22:00
## 1064 Abarrotes       08:00       22:00
## 1065 Abarrotes       08:00       22:00
## 1066 Abarrotes       08:00       22:00
## 1067 Abarrotes       08:00       22:00
## 1068 Abarrotes       08:00       22:00
## 1069 Abarrotes       08:00       22:00
## 1070 Abarrotes       08:00       22:00
## 1071 Abarrotes       08:00       22:00
## 1072 Abarrotes       08:00       22:00
## 1073 Abarrotes       08:00       22:00
## 1074 Abarrotes       08:00       22:00
## 1075 Abarrotes       08:00       22:00
## 1076 Abarrotes       08:00       22:00
## 1077 Abarrotes       08:00       22:00
## 1078 Abarrotes       08:00       22:00
## 1079 Abarrotes       08:00       22:00
## 1080 Abarrotes       08:00       22:00
## 1081 Abarrotes       08:00       22:00
## 1082 Abarrotes       08:00       22:00
## 1083 Abarrotes       08:00       22:00
## 1084 Abarrotes       08:00       22:00
## 1085 Abarrotes       08:00       22:00
## 1086 Abarrotes       08:00       22:00
## 1087 Abarrotes       08:00       22:00
## 1088 Abarrotes       08:00       22:00
## 1089 Abarrotes       08:00       22:00
## 1090 Abarrotes       08:00       22:00
## 1091 Abarrotes       08:00       22:00
## 1092 Abarrotes       08:00       22:00
## 1093 Abarrotes       08:00       22:00
## 1094 Abarrotes       08:00       22:00
## 1095 Abarrotes       08:00       22:00
## 1096 Abarrotes       08:00       22:00
## 1097 Abarrotes       08:00       22:00
## 1098 Abarrotes       08:00       22:00
## 1099 Abarrotes       08:00       22:00
## 1100 Abarrotes       08:00       22:00
## 1101 Abarrotes       08:00       22:00
## 1102 Abarrotes       08:00       22:00
## 1103 Abarrotes       08:00       22:00
## 1104 Abarrotes       08:00       22:00
## 1105 Abarrotes       08:00       22:00
## 1106 Abarrotes       08:00       22:00
## 1107 Abarrotes       08:00       22:00
## 1108 Abarrotes       08:00       22:00
## 1109 Abarrotes       08:00       22:00
## 1110 Abarrotes       08:00       22:00
## 1111 Abarrotes       08:00       22:00
## 1112 Abarrotes       08:00       22:00
## 1113 Abarrotes       08:00       22:00
## 1114 Abarrotes       08:00       22:00
## 1115 Abarrotes       08:00       22:00
## 1116 Abarrotes       08:00       22:00
## 1117 Abarrotes       08:00       22:00
## 1118 Abarrotes       08:00       22:00
## 1119 Abarrotes       08:00       22:00
## 1120 Abarrotes       08:00       22:00
## 1121 Abarrotes       08:00       22:00
## 1122 Abarrotes       08:00       22:00
## 1123 Abarrotes       08:00       22:00
## 1124 Abarrotes       08:00       22:00
## 1125 Abarrotes       08:00       22:00
## 1126 Abarrotes       08:00       22:00
## 1127 Abarrotes       08:00       22:00
## 1128 Abarrotes       08:00       22:00
## 1129 Abarrotes       08:00       22:00
## 1130 Abarrotes       08:00       22:00
## 1131 Abarrotes       08:00       22:00
## 1132 Abarrotes       08:00       22:00
## 1133 Abarrotes       08:00       22:00
## 1134 Abarrotes       08:00       22:00
## 1135 Abarrotes       08:00       22:00
## 1136 Abarrotes       08:00       22:00
## 1137 Abarrotes       08:00       22:00
## 1138 Abarrotes       08:00       22:00
## 1139 Abarrotes       08:00       22:00
## 1140 Abarrotes       08:00       22:00
## 1141 Abarrotes       08:00       22:00
## 1142 Abarrotes       08:00       22:00
## 1143 Abarrotes       08:00       22:00
## 1144 Abarrotes       08:00       22:00
## 1145 Abarrotes       08:00       22:00
## 1146 Abarrotes       08:00       22:00
## 1147 Abarrotes       08:00       22:00
## 1148 Abarrotes       08:00       22:00
## 1149 Abarrotes       08:00       22:00
## 1150 Abarrotes       08:00       22:00
## 1151 Abarrotes       08:00       22:00
## 1152 Abarrotes       08:00       22:00
## 1153 Abarrotes       08:00       22:00
## 1154 Abarrotes       08:00       22:00
## 1155 Abarrotes       08:00       22:00
## 1156 Abarrotes       08:00       22:00
## 1157 Abarrotes       08:00       22:00
## 1158 Abarrotes       08:00       22:00
## 1159 Abarrotes       08:00       22:00
## 1160 Abarrotes       08:00       22:00
## 1161 Abarrotes       08:00       22:00
## 1162 Abarrotes       08:00       22:00
## 1163 Abarrotes       08:00       22:00
## 1164 Abarrotes       08:00       22:00
## 1165 Abarrotes       08:00       22:00
## 1166 Abarrotes       08:00       22:00
## 1167 Abarrotes       08:00       22:00
## 1168 Abarrotes       08:00       22:00
## 1169 Abarrotes       08:00       22:00
## 1170 Abarrotes       08:00       22:00
## 1171 Abarrotes       08:00       22:00
## 1172 Abarrotes       08:00       22:00
## 1173 Abarrotes       08:00       22:00
## 1174 Abarrotes       08:00       22:00
## 1175 Abarrotes       08:00       22:00
## 1176 Abarrotes       08:00       22:00
## 1177 Abarrotes       08:00       22:00
## 1178 Abarrotes       08:00       22:00
## 1179 Abarrotes       08:00       22:00
## 1180 Abarrotes       08:00       22:00
## 1181 Abarrotes       08:00       22:00
## 1182 Abarrotes       08:00       22:00
## 1183 Abarrotes       08:00       22:00
## 1184 Abarrotes       08:00       22:00
## 1185 Abarrotes       08:00       22:00
## 1186 Abarrotes       08:00       22:00
## 1187 Abarrotes       08:00       22:00
## 1188 Abarrotes       08:00       22:00
## 1189 Abarrotes       08:00       22:00
## 1190 Abarrotes       08:00       22:00
## 1191 Abarrotes       08:00       22:00
## 1192 Abarrotes       08:00       22:00
## 1193 Abarrotes       08:00       22:00
## 1194 Abarrotes       08:00       22:00
## 1195 Abarrotes       08:00       22:00
## 1196 Abarrotes       08:00       22:00
## 1197 Abarrotes       08:00       22:00
## 1198 Abarrotes       08:00       22:00
## 1199 Abarrotes       08:00       22:00
## 1200 Abarrotes       08:00       22:00
## 1201 Abarrotes       08:00       22:00
## 1202 Abarrotes       08:00       22:00
## 1203 Abarrotes       08:00       22:00
## 1204 Abarrotes       08:00       22:00
## 1205 Abarrotes       08:00       22:00
## 1206 Abarrotes       08:00       22:00
## 1207 Abarrotes       08:00       22:00
## 1208 Abarrotes       08:00       22:00
## 1209 Abarrotes       08:00       22:00
## 1210 Abarrotes       08:00       22:00
## 1211 Abarrotes       08:00       22:00
## 1212 Abarrotes       08:00       22:00
## 1213 Abarrotes       08:00       22:00
## 1214 Abarrotes       08:00       22:00
## 1215 Abarrotes       08:00       22:00
## 1216 Abarrotes       08:00       22:00
## 1217 Abarrotes       08:00       22:00
## 1218 Abarrotes       08:00       22:00
## 1219 Abarrotes       08:00       22:00
## 1220 Abarrotes       08:00       22:00
## 1221 Abarrotes       08:00       22:00
## 1222 Abarrotes       08:00       22:00
## 1223 Abarrotes       08:00       22:00
## 1224 Abarrotes       08:00       22:00
## 1225 Abarrotes       08:00       22:00
## 1226 Abarrotes       08:00       22:00
## 1227 Abarrotes       08:00       22:00
## 1228 Abarrotes       08:00       22:00
## 1229 Abarrotes       08:00       22:00
## 1230 Abarrotes       08:00       22:00
## 1231 Abarrotes       08:00       22:00
## 1232 Abarrotes       08:00       22:00
## 1233 Abarrotes       08:00       22:00
## 1234 Abarrotes       08:00       22:00
## 1235 Abarrotes       08:00       22:00
## 1236 Abarrotes       08:00       22:00
## 1237 Abarrotes       08:00       22:00
## 1238 Abarrotes       08:00       22:00
## 1239 Abarrotes       08:00       22:00
## 1240 Abarrotes       08:00       22:00
## 1241 Abarrotes       08:00       22:00
## 1242 Abarrotes       08:00       22:00
## 1243 Abarrotes       08:00       22:00
## 1244 Abarrotes       08:00       22:00
## 1245 Abarrotes       08:00       22:00
## 1246 Abarrotes       08:00       22:00
## 1247 Abarrotes       08:00       22:00
## 1248 Abarrotes       08:00       22:00
## 1249 Abarrotes       08:00       22:00
## 1250 Abarrotes       08:00       22:00
## 1251 Abarrotes       08:00       22:00
## 1252 Abarrotes       08:00       22:00
## 1253 Abarrotes       08:00       22:00
## 1254 Abarrotes       08:00       22:00
## 1255 Abarrotes       08:00       22:00
## 1256 Abarrotes       08:00       22:00
## 1257 Abarrotes       08:00       22:00
## 1258 Abarrotes       08:00       22:00
## 1259 Abarrotes       08:00       22:00
## 1260 Abarrotes       08:00       22:00
## 1261 Abarrotes       08:00       22:00
## 1262 Abarrotes       08:00       22:00
## 1263 Abarrotes       08:00       22:00
## 1264 Abarrotes       08:00       22:00
## 1265 Abarrotes       08:00       22:00
## 1266 Abarrotes       08:00       22:00
## 1267 Abarrotes       08:00       22:00
## 1268 Abarrotes       08:00       22:00
## 1269 Abarrotes       08:00       22:00
## 1270 Abarrotes       08:00       22:00
## 1271 Abarrotes       08:00       22:00
## 1272 Abarrotes       08:00       22:00
## 1273 Abarrotes       08:00       22:00
## 1274 Abarrotes       08:00       22:00
## 1275 Abarrotes       08:00       22:00
## 1276 Abarrotes       08:00       22:00
## 1277 Abarrotes       08:00       22:00
## 1278 Abarrotes       08:00       22:00
## 1279 Abarrotes       08:00       22:00
## 1280 Abarrotes       08:00       22:00
## 1281 Abarrotes       08:00       22:00
## 1282 Abarrotes       08:00       22:00
## 1283 Abarrotes       08:00       22:00
## 1284 Abarrotes       08:00       22:00
## 1285 Abarrotes       08:00       22:00
## 1286 Abarrotes       08:00       22:00
## 1287 Abarrotes       08:00       22:00
## 1288 Abarrotes       08:00       22:00
## 1289 Abarrotes       08:00       22:00
## 1290 Abarrotes       08:00       22:00
## 1291 Abarrotes       08:00       22:00
## 1292 Abarrotes       08:00       22:00
## 1293 Abarrotes       08:00       22:00
## 1294 Abarrotes       08:00       22:00
## 1295 Abarrotes       08:00       22:00
## 1296 Abarrotes       08:00       22:00
## 1297 Abarrotes       08:00       22:00
## 1298 Abarrotes       08:00       22:00
## 1299 Abarrotes       08:00       22:00
## 1300 Abarrotes       08:00       22:00
## 1301 Abarrotes       08:00       22:00
## 1302 Abarrotes       08:00       22:00
## 1303 Abarrotes       08:00       22:00
## 1304 Abarrotes       08:00       22:00
## 1305 Abarrotes       08:00       22:00
## 1306 Abarrotes       08:00       22:00
## 1307 Abarrotes       08:00       22:00
## 1308 Abarrotes       08:00       22:00
## 1309 Abarrotes       08:00       22:00
## 1310 Abarrotes       08:00       22:00
## 1311 Abarrotes       08:00       22:00
## 1312 Abarrotes       08:00       22:00
## 1313 Abarrotes       08:00       22:00
## 1314 Abarrotes       08:00       22:00
## 1315 Abarrotes       08:00       22:00
## 1316 Abarrotes       08:00       22:00
## 1317 Abarrotes       08:00       22:00
## 1318 Abarrotes       08:00       22:00
## 1319 Abarrotes       08:00       22:00
## 1320 Abarrotes       08:00       22:00
## 1321 Abarrotes       08:00       22:00
## 1322 Abarrotes       08:00       22:00
## 1323 Abarrotes       08:00       22:00
## 1324 Abarrotes       08:00       22:00
## 1325 Abarrotes       08:00       22:00
## 1326 Abarrotes       08:00       22:00
## 1327 Abarrotes       08:00       22:00
## 1328 Abarrotes       08:00       22:00
## 1329 Abarrotes       08:00       22:00
## 1330 Abarrotes       08:00       22:00
## 1331 Abarrotes       08:00       22:00
## 1332 Abarrotes       08:00       22:00
## 1333 Abarrotes       08:00       22:00
## 1334 Abarrotes       08:00       22:00
## 1335 Abarrotes       08:00       22:00
## 1336 Abarrotes       08:00       22:00
## 1337 Abarrotes       08:00       22:00
## 1338 Abarrotes       08:00       22:00
## 1339 Abarrotes       08:00       22:00
## 1340 Abarrotes       08:00       22:00
## 1341 Abarrotes       08:00       22:00
## 1342 Abarrotes       08:00       22:00
## 1343 Abarrotes       08:00       22:00
## 1344 Abarrotes       08:00       22:00
## 1345 Abarrotes       08:00       22:00
## 1346 Abarrotes       08:00       22:00
## 1347 Abarrotes       08:00       22:00
## 1348 Abarrotes       08:00       22:00
## 1349 Abarrotes       08:00       22:00
## 1350 Abarrotes       08:00       22:00
## 1351 Abarrotes       08:00       22:00
## 1352 Abarrotes       08:00       22:00
## 1353 Abarrotes       08:00       22:00
## 1354 Abarrotes       08:00       22:00
## 1355 Abarrotes       08:00       22:00
## 1356 Abarrotes       08:00       22:00
## 1357 Abarrotes       08:00       22:00
## 1358 Abarrotes       08:00       22:00
## 1359 Abarrotes       08:00       22:00
## 1360 Abarrotes       08:00       22:00
## 1361 Abarrotes       08:00       22:00
## 1362 Abarrotes       08:00       22:00
## 1363 Abarrotes       08:00       22:00
## 1364 Abarrotes       08:00       22:00
## 1365 Abarrotes       08:00       22:00
## 1366 Abarrotes       08:00       22:00
## 1367 Abarrotes       08:00       22:00
## 1368 Abarrotes       08:00       22:00
## 1369 Abarrotes       08:00       22:00
## 1370 Abarrotes       08:00       22:00
## 1371 Abarrotes       08:00       22:00
## 1372 Abarrotes       08:00       22:00
## 1373 Abarrotes       08:00       22:00
## 1374 Abarrotes       08:00       22:00
## 1375 Abarrotes       08:00       22:00
## 1376 Abarrotes       08:00       22:00
## 1377 Abarrotes       08:00       22:00
## 1378 Abarrotes       08:00       22:00
## 1379 Abarrotes       08:00       22:00
## 1380 Abarrotes       08:00       22:00
## 1381 Abarrotes       08:00       22:00
## 1382 Abarrotes       08:00       22:00
## 1383 Abarrotes       08:00       22:00
## 1384 Abarrotes       08:00       22:00
## 1385 Abarrotes       08:00       22:00
## 1386 Abarrotes       08:00       22:00
## 1387 Abarrotes       08:00       22:00
## 1388 Abarrotes       08:00       22:00
## 1389 Abarrotes       08:00       22:00
## 1390 Abarrotes       08:00       22:00
## 1391 Abarrotes       08:00       22:00
## 1392 Abarrotes       08:00       22:00
## 1393 Abarrotes       08:00       22:00
## 1394 Abarrotes       08:00       22:00
## 1395 Abarrotes       08:00       22:00
## 1396 Abarrotes       08:00       22:00
## 1397 Abarrotes       08:00       22:00
## 1398 Abarrotes       08:00       22:00
## 1399 Abarrotes       08:00       22:00
## 1400 Abarrotes       08:00       22:00
## 1401 Abarrotes       08:00       22:00
## 1402 Abarrotes       08:00       22:00
## 1403 Abarrotes       08:00       22:00
## 1404 Abarrotes       08:00       22:00
## 1405 Abarrotes       08:00       22:00
## 1406 Abarrotes       08:00       22:00
## 1407 Abarrotes       08:00       22:00
## 1408 Abarrotes       08:00       22:00
## 1409 Abarrotes       08:00       22:00
## 1410 Abarrotes       08:00       22:00
## 1411 Abarrotes       08:00       22:00
## 1412 Abarrotes       08:00       22:00
## 1413 Abarrotes       08:00       22:00
## 1414 Abarrotes       08:00       22:00
## 1415 Abarrotes       08:00       22:00
## 1416 Abarrotes       08:00       22:00
## 1417 Abarrotes       08:00       22:00
## 1418 Abarrotes       08:00       22:00
## 1419 Abarrotes       08:00       22:00
## 1420 Abarrotes       08:00       22:00
## 1421 Abarrotes       08:00       22:00
## 1422 Abarrotes       08:00       22:00
## 1423 Abarrotes       08:00       22:00
## 1424 Abarrotes       08:00       22:00
## 1425 Abarrotes       08:00       22:00
## 1426 Abarrotes       08:00       22:00
## 1427 Abarrotes       08:00       22:00
## 1428 Abarrotes       08:00       22:00
## 1429 Abarrotes       08:00       22:00
## 1430 Abarrotes       08:00       22:00
## 1431 Abarrotes       08:00       22:00
## 1432 Abarrotes       08:00       22:00
## 1433 Abarrotes       08:00       22:00
## 1434 Abarrotes       08:00       22:00
## 1435 Abarrotes       08:00       22:00
## 1436 Abarrotes       08:00       22:00
## 1437 Abarrotes       08:00       22:00
## 1438 Abarrotes       08:00       22:00
## 1439 Abarrotes       08:00       22:00
## 1440 Abarrotes       08:00       22:00
## 1441 Abarrotes       08:00       22:00
## 1442 Abarrotes       08:00       22:00
## 1443 Abarrotes       08:00       22:00
## 1444 Abarrotes       08:00       22:00
## 1445 Abarrotes       08:00       22:00
## 1446 Abarrotes       08:00       22:00
## 1447 Abarrotes       08:00       22:00
## 1448 Abarrotes       08:00       22:00
## 1449 Abarrotes       08:00       22:00
## 1450 Abarrotes       08:00       22:00
## 1451 Abarrotes       08:00       22:00
## 1452 Abarrotes       08:00       22:00
## 1453 Abarrotes       08:00       22:00
## 1454 Abarrotes       08:00       22:00
## 1455 Abarrotes       08:00       22:00
## 1456 Abarrotes       08:00       22:00
## 1457 Abarrotes       08:00       22:00
## 1458 Abarrotes       08:00       22:00
## 1459 Abarrotes       08:00       22:00
## 1460 Abarrotes       08:00       22:00
## 1461 Abarrotes       08:00       22:00
## 1462 Abarrotes       08:00       22:00
## 1463 Abarrotes       08:00       22:00
## 1464 Abarrotes       08:00       22:00
## 1465 Abarrotes       08:00       22:00
## 1466 Abarrotes       08:00       22:00
## 1467 Abarrotes       08:00       22:00
## 1468 Abarrotes       08:00       22:00
## 1469 Abarrotes       08:00       22:00
## 1470 Abarrotes       08:00       22:00
## 1471 Abarrotes       08:00       22:00
## 1472 Abarrotes       08:00       22:00
## 1473 Abarrotes       08:00       22:00
## 1474 Abarrotes       08:00       22:00
## 1475 Abarrotes       08:00       22:00
## 1476 Abarrotes       08:00       22:00
## 1477 Abarrotes       08:00       22:00
## 1478 Abarrotes       08:00       22:00
## 1479 Abarrotes       08:00       22:00
## 1480 Abarrotes       08:00       22:00
## 1481 Abarrotes       08:00       22:00
## 1482 Abarrotes       08:00       22:00
## 1483 Abarrotes       08:00       22:00
## 1484 Abarrotes       08:00       22:00
## 1485 Abarrotes       08:00       22:00
## 1486 Abarrotes       08:00       22:00
## 1487 Abarrotes       08:00       22:00
## 1488 Abarrotes       08:00       22:00
## 1489 Abarrotes       08:00       22:00
## 1490 Abarrotes       08:00       22:00
## 1491 Abarrotes       08:00       22:00
## 1492 Abarrotes       08:00       22:00
## 1493 Abarrotes       08:00       22:00
## 1494 Abarrotes       08:00       22:00
## 1495 Abarrotes       08:00       22:00
## 1496 Abarrotes       08:00       22:00
## 1497 Abarrotes       08:00       22:00
## 1498 Abarrotes       08:00       22:00
## 1499 Abarrotes       08:00       22:00
## 1500 Abarrotes       08:00       22:00
## 1501 Abarrotes       08:00       22:00
## 1502 Abarrotes       08:00       22:00
## 1503 Abarrotes       08:00       22:00
## 1504 Abarrotes       08:00       22:00
## 1505 Abarrotes       08:00       22:00
## 1506 Abarrotes       08:00       22:00
## 1507 Abarrotes       08:00       22:00
## 1508 Abarrotes       08:00       22:00
## 1509 Abarrotes       08:00       22:00
## 1510 Abarrotes       08:00       22:00
## 1511 Abarrotes       08:00       22:00
## 1512 Abarrotes       08:00       22:00
## 1513 Abarrotes       08:00       22:00
## 1514 Abarrotes       08:00       22:00
## 1515 Abarrotes       08:00       22:00
## 1516 Abarrotes       08:00       22:00
## 1517 Abarrotes       08:00       22:00
## 1518 Abarrotes       08:00       22:00
## 1519 Abarrotes       08:00       22:00
## 1520 Abarrotes       08:00       22:00
## 1521 Abarrotes       08:00       22:00
## 1522 Abarrotes       08:00       22:00
## 1523 Abarrotes       08:00       22:00
## 1524 Abarrotes       08:00       22:00
## 1525 Abarrotes       08:00       22:00
## 1526 Abarrotes       08:00       22:00
## 1527 Abarrotes       08:00       22:00
## 1528 Abarrotes       08:00       22:00
## 1529 Abarrotes       08:00       22:00
## 1530 Abarrotes       08:00       22:00
## 1531 Abarrotes       08:00       22:00
## 1532 Abarrotes       08:00       22:00
## 1533 Abarrotes       08:00       22:00
## 1534 Abarrotes       08:00       22:00
## 1535 Abarrotes       08:00       22:00
## 1536 Abarrotes       08:00       22:00
## 1537 Abarrotes       08:00       22:00
## 1538 Abarrotes       08:00       22:00
## 1539 Abarrotes       08:00       22:00
## 1540 Abarrotes       08:00       22:00
## 1541 Abarrotes       08:00       22:00
## 1542 Abarrotes       08:00       22:00
## 1543 Abarrotes       08:00       22:00
## 1544 Abarrotes       08:00       22:00
## 1545 Abarrotes       08:00       22:00
## 1546 Abarrotes       08:00       22:00
## 1547 Abarrotes       08:00       22:00
## 1548 Abarrotes       08:00       22:00
## 1549 Abarrotes       08:00       22:00
## 1550 Abarrotes       08:00       22:00
## 1551 Abarrotes       08:00       22:00
## 1552 Abarrotes       08:00       22:00
## 1553 Abarrotes       08:00       22:00
## 1554 Abarrotes       08:00       22:00
## 1555 Abarrotes       08:00       22:00
## 1556 Abarrotes       08:00       22:00
## 1557 Abarrotes       08:00       22:00
## 1558 Abarrotes       08:00       22:00
## 1559 Abarrotes       08:00       22:00
## 1560 Abarrotes       08:00       22:00
## 1561 Abarrotes       08:00       22:00
## 1562 Abarrotes       08:00       22:00
## 1563 Abarrotes       08:00       22:00
## 1564 Abarrotes       08:00       22:00
## 1565 Abarrotes       08:00       22:00
## 1566 Abarrotes       08:00       22:00
## 1567 Abarrotes       08:00       22:00
## 1568 Abarrotes       08:00       22:00
## 1569 Abarrotes       08:00       22:00
## 1570 Abarrotes       08:00       22:00
## 1571 Abarrotes       08:00       22:00
## 1572 Abarrotes       08:00       22:00
## 1573 Abarrotes       08:00       22:00
## 1574 Abarrotes       08:00       22:00
## 1575 Abarrotes       08:00       22:00
## 1576 Abarrotes       08:00       22:00
## 1577 Abarrotes       08:00       22:00
## 1578 Abarrotes       08:00       22:00
## 1579 Abarrotes       08:00       22:00
## 1580 Abarrotes       08:00       22:00
## 1581 Abarrotes       08:00       22:00
## 1582 Abarrotes       08:00       22:00
## 1583 Abarrotes       08:00       22:00
## 1584 Abarrotes       08:00       22:00
## 1585 Abarrotes       08:00       22:00
## 1586 Abarrotes       08:00       22:00
## 1587 Abarrotes       08:00       22:00
## 1588 Abarrotes       08:00       22:00
## 1589 Abarrotes       08:00       22:00
## 1590 Abarrotes       08:00       22:00
## 1591 Abarrotes       08:00       22:00
## 1592 Abarrotes       08:00       22:00
## 1593 Abarrotes       08:00       22:00
## 1594 Abarrotes       08:00       22:00
## 1595 Abarrotes       08:00       22:00
## 1596 Abarrotes       08:00       22:00
## 1597 Abarrotes       08:00       22:00
## 1598 Abarrotes       08:00       22:00
## 1599 Abarrotes       08:00       22:00
## 1600 Abarrotes       08:00       22:00
## 1601 Abarrotes       08:00       22:00
## 1602 Abarrotes       08:00       22:00
## 1603 Abarrotes       08:00       22:00
## 1604 Abarrotes       08:00       22:00
## 1605 Abarrotes       08:00       22:00
## 1606 Abarrotes       08:00       22:00
## 1607 Abarrotes       08:00       22:00
## 1608 Abarrotes       08:00       22:00
## 1609 Abarrotes       08:00       22:00
## 1610 Abarrotes       08:00       22:00
## 1611 Abarrotes       08:00       22:00
## 1612 Abarrotes       08:00       22:00
## 1613 Abarrotes       08:00       22:00
## 1614 Abarrotes       08:00       22:00
## 1615 Abarrotes       08:00       22:00
## 1616 Abarrotes       08:00       22:00
## 1617 Abarrotes       08:00       22:00
## 1618 Abarrotes       08:00       22:00
## 1619 Abarrotes       08:00       22:00
## 1620 Abarrotes       08:00       22:00
## 1621 Abarrotes       08:00       22:00
## 1622 Abarrotes       08:00       22:00
## 1623 Abarrotes       08:00       22:00
## 1624 Abarrotes       08:00       22:00
## 1625 Abarrotes       08:00       22:00
## 1626 Abarrotes       08:00       22:00
## 1627 Abarrotes       08:00       22:00
## 1628 Abarrotes       08:00       22:00
## 1629 Abarrotes       08:00       22:00
## 1630 Abarrotes       08:00       22:00
## 1631 Abarrotes       08:00       22:00
## 1632 Abarrotes       08:00       22:00
## 1633 Abarrotes       08:00       22:00
## 1634 Abarrotes       08:00       22:00
## 1635 Abarrotes       08:00       22:00
## 1636 Abarrotes       08:00       22:00
## 1637 Abarrotes       08:00       22:00
## 1638 Abarrotes       08:00       22:00
## 1639 Abarrotes       08:00       22:00
## 1640 Abarrotes       08:00       22:00
## 1641 Abarrotes       08:00       22:00
## 1642 Abarrotes       08:00       22:00
## 1643 Abarrotes       08:00       22:00
## 1644 Abarrotes       08:00       22:00
## 1645 Abarrotes       08:00       22:00
## 1646 Abarrotes       08:00       22:00
## 1647 Abarrotes       08:00       22:00
## 1648 Abarrotes       08:00       22:00
## 1649 Abarrotes       08:00       22:00
## 1650 Abarrotes       08:00       22:00
## 1651 Abarrotes       08:00       22:00
## 1652 Abarrotes       08:00       22:00
## 1653 Abarrotes       08:00       22:00
## 1654 Abarrotes       08:00       22:00
## 1655 Abarrotes       08:00       22:00
## 1656 Abarrotes       08:00       22:00
## 1657 Abarrotes       08:00       22:00
## 1658 Abarrotes       08:00       22:00
## 1659 Abarrotes       08:00       22:00
## 1660 Abarrotes       08:00       22:00
## 1661 Abarrotes       08:00       22:00
## 1662 Abarrotes       08:00       22:00
## 1663 Abarrotes       08:00       22:00
## 1664 Abarrotes       08:00       22:00
## 1665 Abarrotes       08:00       22:00
## 1666 Abarrotes       08:00       22:00
## 1667 Abarrotes       08:00       22:00
## 1668 Abarrotes       08:00       22:00
## 1669 Abarrotes       08:00       22:00
## 1670 Abarrotes       08:00       22:00
## 1671 Abarrotes       08:00       22:00
## 1672 Abarrotes       08:00       22:00
## 1673 Abarrotes       08:00       22:00
## 1674 Abarrotes       08:00       22:00
## 1675 Abarrotes       08:00       22:00
## 1676 Abarrotes       08:00       22:00
## 1677 Abarrotes       08:00       22:00
## 1678 Abarrotes       08:00       22:00
## 1679 Abarrotes       08:00       22:00
## 1680 Abarrotes       08:00       22:00
## 1681 Abarrotes       08:00       22:00
## 1682 Abarrotes       08:00       22:00
## 1683 Abarrotes       08:00       22:00
## 1684 Abarrotes       08:00       22:00
## 1685 Abarrotes       08:00       22:00
## 1686 Abarrotes       08:00       22:00
## 1687 Abarrotes       08:00       22:00
## 1688 Abarrotes       08:00       22:00
## 1689 Abarrotes       08:00       22:00
## 1690 Abarrotes       08:00       22:00
## 1691 Abarrotes       08:00       22:00
## 1692 Abarrotes       08:00       22:00
## 1693 Abarrotes       08:00       22:00
## 1694 Abarrotes       08:00       22:00
## 1695 Abarrotes       08:00       22:00
## 1696 Abarrotes       08:00       22:00
## 1697 Abarrotes       08:00       22:00
## 1698 Abarrotes       08:00       22:00
## 1699 Abarrotes       08:00       22:00
## 1700 Abarrotes       08:00       22:00
## 1701 Abarrotes       08:00       22:00
## 1702 Abarrotes       08:00       22:00
## 1703 Abarrotes       08:00       22:00
## 1704 Abarrotes       08:00       22:00
## 1705 Abarrotes       08:00       22:00
## 1706 Abarrotes       08:00       22:00
## 1707 Abarrotes       08:00       22:00
## 1708 Abarrotes       08:00       22:00
## 1709 Abarrotes       08:00       22:00
## 1710 Abarrotes       08:00       22:00
## 1711 Abarrotes       08:00       22:00
## 1712 Abarrotes       08:00       22:00
## 1713 Abarrotes       08:00       22:00
## 1714 Abarrotes       08:00       22:00
## 1715 Abarrotes       08:00       22:00
## 1716 Abarrotes       08:00       22:00
## 1717 Abarrotes       08:00       22:00
## 1718 Abarrotes       08:00       22:00
## 1719 Abarrotes       08:00       22:00
## 1720 Abarrotes       08:00       22:00
## 1721 Abarrotes       08:00       22:00
## 1722 Abarrotes       08:00       22:00
## 1723 Abarrotes       08:00       22:00
## 1724 Abarrotes       08:00       22:00
## 1725 Abarrotes       08:00       22:00
## 1726 Abarrotes       08:00       22:00
## 1727 Abarrotes       08:00       22:00
## 1728 Abarrotes       08:00       22:00
## 1729 Abarrotes       08:00       22:00
## 1730 Abarrotes       08:00       22:00
## 1731 Abarrotes       08:00       22:00
## 1732 Abarrotes       08:00       22:00
## 1733 Abarrotes       08:00       22:00
## 1734 Abarrotes       08:00       22:00
## 1735 Abarrotes       08:00       22:00
## 1736 Abarrotes       08:00       22:00
## 1737 Abarrotes       08:00       22:00
## 1738 Abarrotes       08:00       22:00
## 1739 Abarrotes       08:00       22:00
## 1740 Abarrotes       08:00       22:00
## 1741 Abarrotes       08:00       22:00
## 1742 Abarrotes       08:00       22:00
## 1743 Abarrotes       08:00       22:00
## 1744 Abarrotes       08:00       22:00
## 1745 Abarrotes       08:00       22:00
## 1746 Abarrotes       08:00       22:00
## 1747 Abarrotes       08:00       22:00
## 1748 Abarrotes       08:00       22:00
## 1749 Abarrotes       08:00       22:00
## 1750 Abarrotes       08:00       22:00
## 1751 Abarrotes       08:00       22:00
## 1752 Abarrotes       08:00       22:00
## 1753 Abarrotes       08:00       22:00
## 1754 Abarrotes       08:00       22:00
## 1755 Abarrotes       08:00       22:00
## 1756 Abarrotes       08:00       22:00
## 1757 Abarrotes       08:00       22:00
## 1758 Abarrotes       08:00       22:00
## 1759 Abarrotes       08:00       22:00
## 1760 Abarrotes       08:00       22:00
## 1761 Abarrotes       08:00       22:00
## 1762 Abarrotes       08:00       22:00
## 1763 Abarrotes       08:00       22:00
## 1764 Abarrotes       08:00       22:00
## 1765 Abarrotes       08:00       22:00
## 1766 Abarrotes       08:00       22:00
## 1767 Abarrotes       08:00       22:00
## 1768 Abarrotes       08:00       22:00
## 1769 Abarrotes       08:00       22:00
## 1770 Abarrotes       08:00       22:00
## 1771 Abarrotes       08:00       22:00
## 1772 Abarrotes       08:00       22:00
## 1773 Abarrotes       08:00       22:00
## 1774 Abarrotes       08:00       22:00
## 1775 Abarrotes       08:00       22:00
## 1776 Abarrotes       08:00       22:00
## 1777 Abarrotes       08:00       22:00
## 1778 Abarrotes       08:00       22:00
## 1779 Abarrotes       08:00       22:00
## 1780 Abarrotes       08:00       22:00
## 1781 Abarrotes       08:00       22:00
## 1782 Abarrotes       08:00       22:00
## 1783 Abarrotes       08:00       22:00
## 1784 Abarrotes       08:00       22:00
## 1785 Abarrotes       08:00       22:00
## 1786 Abarrotes       08:00       22:00
## 1787 Abarrotes       08:00       22:00
## 1788 Abarrotes       08:00       22:00
## 1789 Abarrotes       08:00       22:00
## 1790 Abarrotes       08:00       22:00
## 1791 Abarrotes       08:00       22:00
## 1792 Abarrotes       08:00       22:00
## 1793 Abarrotes       08:00       22:00
## 1794 Abarrotes       08:00       22:00
## 1795 Abarrotes       08:00       22:00
## 1796 Abarrotes       08:00       22:00
## 1797 Abarrotes       08:00       22:00
## 1798 Abarrotes       08:00       22:00
## 1799 Abarrotes       08:00       22:00
## 1800 Abarrotes       08:00       22:00
## 1801 Abarrotes       08:00       22:00
## 1802 Abarrotes       08:00       22:00
## 1803 Abarrotes       08:00       22:00
## 1804 Abarrotes       08:00       22:00
## 1805 Abarrotes       08:00       22:00
## 1806 Abarrotes       08:00       22:00
## 1807 Abarrotes       08:00       22:00
## 1808 Abarrotes       08:00       22:00
## 1809 Abarrotes       08:00       22:00
## 1810 Abarrotes       08:00       22:00
## 1811 Abarrotes       08:00       22:00
## 1812 Abarrotes       08:00       22:00
## 1813 Abarrotes       08:00       22:00
## 1814 Abarrotes       08:00       22:00
## 1815 Abarrotes       08:00       22:00
## 1816 Abarrotes       08:00       22:00
## 1817 Abarrotes       08:00       22:00
## 1818 Abarrotes       08:00       22:00
## 1819 Abarrotes       08:00       22:00
## 1820 Abarrotes       08:00       22:00
## 1821 Abarrotes       08:00       22:00
## 1822 Abarrotes       08:00       22:00
## 1823 Abarrotes       08:00       22:00
## 1824 Abarrotes       08:00       22:00
## 1825 Abarrotes       08:00       22:00
## 1826 Abarrotes       08:00       22:00
## 1827 Abarrotes       08:00       22:00
## 1828 Abarrotes       08:00       22:00
## 1829 Abarrotes       08:00       22:00
## 1830 Abarrotes       08:00       22:00
## 1831 Abarrotes       08:00       22:00
## 1832 Abarrotes       08:00       22:00
## 1833 Abarrotes       08:00       22:00
## 1834 Abarrotes       08:00       22:00
## 1835 Abarrotes       08:00       22:00
## 1836 Abarrotes       08:00       22:00
## 1837 Abarrotes       08:00       22:00
## 1838 Abarrotes       08:00       22:00
## 1839 Abarrotes       08:00       22:00
## 1840 Abarrotes       08:00       22:00
## 1841 Abarrotes       08:00       22:00
## 1842 Abarrotes       08:00       22:00
## 1843 Abarrotes       08:00       22:00
## 1844 Abarrotes       08:00       22:00
## 1845 Abarrotes       08:00       22:00
## 1846 Abarrotes       08:00       22:00
## 1847 Abarrotes       08:00       22:00
## 1848 Abarrotes       08:00       22:00
## 1849 Abarrotes       08:00       22:00
## 1850 Abarrotes       08:00       22:00
## 1851 Abarrotes       08:00       22:00
## 1852 Abarrotes       08:00       22:00
## 1853 Abarrotes       08:00       22:00
## 1854 Abarrotes       08:00       22:00
## 1855 Abarrotes       08:00       22:00
## 1856 Abarrotes       08:00       22:00
## 1857 Abarrotes       08:00       22:00
## 1858 Abarrotes       08:00       22:00
## 1859 Abarrotes       08:00       22:00
## 1860 Abarrotes       08:00       22:00
## 1861 Abarrotes       08:00       22:00
## 1862 Abarrotes       08:00       22:00
## 1863 Abarrotes       08:00       22:00
## 1864 Abarrotes       08:00       22:00
## 1865 Abarrotes       08:00       22:00
## 1866 Abarrotes       08:00       22:00
## 1867 Abarrotes       08:00       22:00
## 1868 Abarrotes       08:00       22:00
## 1869 Abarrotes       08:00       22:00
## 1870 Abarrotes       08:00       22:00
## 1871 Abarrotes       08:00       22:00
## 1872 Abarrotes       08:00       22:00
## 1873 Abarrotes       08:00       22:00
## 1874 Abarrotes       08:00       22:00
## 1875 Abarrotes       08:00       22:00
## 1876 Abarrotes       08:00       22:00
## 1877 Abarrotes       08:00       22:00
## 1878 Abarrotes       08:00       22:00
## 1879 Abarrotes       08:00       22:00
## 1880 Abarrotes       08:00       22:00
## 1881 Abarrotes       08:00       22:00
## 1882 Abarrotes       08:00       22:00
## 1883 Abarrotes       08:00       22:00
## 1884 Abarrotes       08:00       22:00
## 1885 Abarrotes       08:00       22:00
## 1886 Abarrotes       08:00       22:00
## 1887 Abarrotes       08:00       22:00
## 1888 Abarrotes       08:00       22:00
## 1889 Abarrotes       08:00       22:00
## 1890 Abarrotes       08:00       22:00
## 1891 Abarrotes       08:00       22:00
## 1892 Abarrotes       08:00       22:00
## 1893 Abarrotes       08:00       22:00
## 1894 Abarrotes       08:00       22:00
## 1895 Abarrotes       08:00       22:00
## 1896 Abarrotes       08:00       22:00
## 1897 Abarrotes       08:00       22:00
## 1898 Abarrotes       08:00       22:00
## 1899 Abarrotes       08:00       22:00
## 1900 Abarrotes       08:00       22:00
## 1901 Abarrotes       08:00       22:00
## 1902 Abarrotes       08:00       22:00
## 1903 Abarrotes       08:00       22:00
## 1904 Abarrotes       08:00       22:00
## 1905 Abarrotes       08:00       22:00
## 1906 Abarrotes       08:00       22:00
## 1907 Abarrotes       08:00       22:00
## 1908 Abarrotes       08:00       22:00
## 1909 Abarrotes       08:00       22:00
## 1910 Abarrotes       08:00       22:00
## 1911 Abarrotes       08:00       22:00
## 1912 Abarrotes       08:00       22:00
## 1913 Abarrotes       08:00       22:00
## 1914 Abarrotes       08:00       22:00
## 1915 Abarrotes       08:00       22:00
## 1916 Abarrotes       08:00       22:00
## 1917 Abarrotes       08:00       22:00
## 1918 Abarrotes       08:00       22:00
## 1919 Abarrotes       08:00       22:00
## 1920 Abarrotes       08:00       22:00
## 1921 Abarrotes       08:00       22:00
## 1922 Abarrotes       08:00       22:00
## 1923 Abarrotes       08:00       22:00
## 1924 Abarrotes       08:00       22:00
## 1925 Abarrotes       08:00       22:00
## 1926 Abarrotes       08:00       22:00
## 1927 Abarrotes       08:00       22:00
## 1928 Abarrotes       08:00       22:00
## 1929 Abarrotes       08:00       22:00
## 1930 Abarrotes       08:00       22:00
## 1931 Abarrotes       08:00       22:00
## 1932 Abarrotes       08:00       22:00
## 1933 Abarrotes       08:00       22:00
## 1934 Abarrotes       08:00       22:00
## 1935 Abarrotes       08:00       22:00
## 1936 Abarrotes       08:00       22:00
## 1937 Abarrotes       08:00       22:00
## 1938 Abarrotes       08:00       22:00
## 1939 Abarrotes       08:00       22:00
## 1940 Abarrotes       08:00       22:00
## 1941 Abarrotes       08:00       22:00
## 1942 Abarrotes       08:00       22:00
## 1943 Abarrotes       08:00       22:00
## 1944 Abarrotes       08:00       22:00
## 1945 Abarrotes       08:00       22:00
## 1946 Abarrotes       08:00       22:00
## 1947 Abarrotes       08:00       22:00
## 1948 Abarrotes       08:00       22:00
## 1949 Abarrotes       08:00       22:00
## 1950 Abarrotes       08:00       22:00
## 1951 Abarrotes       08:00       22:00
## 1952 Abarrotes       08:00       22:00
## 1953 Abarrotes       08:00       22:00
## 1954 Abarrotes       08:00       22:00
## 1955 Abarrotes       08:00       22:00
## 1956 Abarrotes       08:00       22:00
## 1957 Abarrotes       08:00       22:00
## 1958 Abarrotes       08:00       22:00
## 1959 Abarrotes       08:00       22:00
## 1960 Abarrotes       08:00       22:00
## 1961 Abarrotes       08:00       22:00
## 1962 Abarrotes       08:00       22:00
## 1963 Abarrotes       08:00       22:00
## 1964 Abarrotes       08:00       22:00
## 1965 Abarrotes       08:00       22:00
## 1966 Abarrotes       08:00       22:00
## 1967 Abarrotes       08:00       22:00
## 1968 Abarrotes       08:00       22:00
## 1969 Abarrotes       08:00       22:00
## 1970 Abarrotes       08:00       22:00
## 1971 Abarrotes       08:00       22:00
## 1972 Abarrotes       08:00       22:00
## 1973 Abarrotes       08:00       22:00
## 1974 Abarrotes       08:00       22:00
## 1975 Abarrotes       08:00       22:00
## 1976 Abarrotes       08:00       22:00
## 1977 Abarrotes       08:00       22:00
## 1978 Abarrotes       08:00       22:00
## 1979 Abarrotes       08:00       22:00
## 1980 Abarrotes       08:00       22:00
## 1981 Abarrotes       08:00       22:00
## 1982 Abarrotes       08:00       22:00
## 1983 Abarrotes       08:00       22:00
## 1984 Abarrotes       08:00       22:00
## 1985 Abarrotes       08:00       22:00
## 1986 Abarrotes       08:00       22:00
## 1987 Abarrotes       08:00       22:00
## 1988 Abarrotes       08:00       22:00
## 1989 Abarrotes       08:00       22:00
## 1990 Abarrotes       08:00       22:00
## 1991 Abarrotes       08:00       22:00
## 1992 Abarrotes       08:00       22:00
## 1993 Abarrotes       08:00       22:00
## 1994 Abarrotes       08:00       22:00
## 1995 Abarrotes       08:00       22:00
## 1996 Abarrotes       08:00       22:00
## 1997 Abarrotes       08:00       22:00
## 1998 Abarrotes       08:00       22:00
## 1999 Abarrotes       08:00       22:00
## 2000 Abarrotes       08:00       22:00
## 2001 Abarrotes       08:00       22:00
## 2002 Abarrotes       08:00       22:00
## 2003 Abarrotes       08:00       22:00
## 2004 Abarrotes       08:00       22:00
## 2005 Abarrotes       08:00       22:00
## 2006 Abarrotes       08:00       22:00
## 2007 Abarrotes       08:00       22:00
## 2008 Abarrotes       08:00       22:00
## 2009 Abarrotes       08:00       22:00
## 2010 Abarrotes       08:00       22:00
## 2011 Abarrotes       08:00       22:00
## 2012 Abarrotes       08:00       22:00
## 2013 Abarrotes       08:00       22:00
## 2014 Abarrotes       08:00       22:00
## 2015 Abarrotes       08:00       22:00
## 2016 Abarrotes       08:00       22:00
## 2017 Abarrotes       08:00       22:00
## 2018 Abarrotes       08:00       22:00
## 2019 Abarrotes       08:00       22:00
## 2020 Abarrotes       08:00       22:00
## 2021 Abarrotes       08:00       22:00
## 2022 Abarrotes       08:00       22:00
## 2023 Abarrotes       08:00       22:00
## 2024 Abarrotes       08:00       22:00
## 2025 Abarrotes       08:00       22:00
## 2026 Abarrotes       08:00       22:00
## 2027 Abarrotes       08:00       22:00
## 2028 Abarrotes       08:00       22:00
## 2029 Abarrotes       08:00       22:00
## 2030 Abarrotes       08:00       22:00
## 2031 Abarrotes       08:00       22:00
## 2032 Abarrotes       08:00       22:00
## 2033 Abarrotes       08:00       22:00
## 2034 Abarrotes       08:00       22:00
## 2035 Abarrotes       08:00       22:00
## 2036 Abarrotes       08:00       22:00
## 2037 Abarrotes       08:00       22:00
## 2038 Abarrotes       08:00       22:00
## 2039 Abarrotes       08:00       22:00
## 2040 Abarrotes       08:00       22:00
## 2041 Abarrotes       08:00       22:00
## 2042 Abarrotes       08:00       22:00
## 2043 Abarrotes       08:00       22:00
## 2044 Abarrotes       08:00       22:00
## 2045 Abarrotes       08:00       22:00
## 2046 Abarrotes       08:00       22:00
## 2047 Abarrotes       08:00       22:00
## 2048 Abarrotes       08:00       22:00
## 2049 Abarrotes       08:00       22:00
## 2050 Abarrotes       08:00       22:00
## 2051 Abarrotes       08:00       22:00
## 2052 Abarrotes       08:00       22:00
## 2053 Abarrotes       08:00       22:00
## 2054 Abarrotes       08:00       22:00
## 2055 Abarrotes       08:00       22:00
## 2056 Abarrotes       08:00       22:00
## 2057 Abarrotes       08:00       22:00
## 2058 Abarrotes       08:00       22:00
## 2059 Abarrotes       08:00       22:00
## 2060 Abarrotes       08:00       22:00
## 2061 Abarrotes       08:00       22:00
## 2062 Abarrotes       08:00       22:00
## 2063 Abarrotes       08:00       22:00
## 2064 Abarrotes       08:00       22:00
## 2065 Abarrotes       08:00       22:00
## 2066 Abarrotes       08:00       22:00
## 2067 Abarrotes       08:00       22:00
## 2068 Abarrotes       08:00       22:00
## 2069 Abarrotes       08:00       22:00
## 2070 Abarrotes       08:00       22:00
## 2071 Abarrotes       08:00       22:00
## 2072 Abarrotes       08:00       22:00
## 2073 Abarrotes       08:00       22:00
## 2074 Abarrotes       08:00       22:00
## 2075 Abarrotes       08:00       22:00
## 2076 Abarrotes       08:00       22:00
## 2077 Abarrotes       08:00       22:00
## 2078 Abarrotes       08:00       22:00
## 2079 Abarrotes       08:00       22:00
## 2080 Abarrotes       08:00       22:00
## 2081 Abarrotes       08:00       22:00
## 2082 Abarrotes       08:00       22:00
## 2083 Abarrotes       08:00       22:00
## 2084 Abarrotes       08:00       22:00
## 2085 Abarrotes       08:00       22:00
## 2086 Abarrotes       08:00       22:00
## 2087 Abarrotes       08:00       22:00
## 2088 Abarrotes       08:00       22:00
## 2089 Abarrotes       08:00       22:00
## 2090 Abarrotes       08:00       22:00
## 2091 Abarrotes       08:00       22:00
## 2092 Abarrotes       08:00       22:00
## 2093 Abarrotes       08:00       22:00
## 2094 Abarrotes       08:00       22:00
## 2095 Abarrotes       08:00       22:00
## 2096 Abarrotes       08:00       22:00
## 2097 Abarrotes       08:00       22:00
## 2098 Abarrotes       08:00       22:00
## 2099 Abarrotes       08:00       22:00
## 2100 Abarrotes       08:00       22:00
## 2101 Abarrotes       08:00       22:00
## 2102 Abarrotes       08:00       22:00
## 2103 Abarrotes       08:00       22:00
## 2104 Abarrotes       08:00       22:00
## 2105 Abarrotes       08:00       22:00
## 2106 Abarrotes       08:00       22:00
## 2107 Abarrotes       08:00       22:00
## 2108 Abarrotes       08:00       22:00
## 2109 Abarrotes       08:00       22:00
## 2110 Abarrotes       08:00       22:00
## 2111 Abarrotes       08:00       22:00
## 2112 Abarrotes       08:00       22:00
## 2113 Abarrotes       08:00       22:00
## 2114 Abarrotes       08:00       22:00
## 2115 Abarrotes       08:00       22:00
## 2116 Abarrotes       08:00       22:00
## 2117 Abarrotes       08:00       22:00
## 2118 Abarrotes       08:00       22:00
## 2119 Abarrotes       08:00       22:00
## 2120 Abarrotes       08:00       22:00
## 2121 Abarrotes       08:00       22:00
## 2122 Abarrotes       08:00       22:00
## 2123 Abarrotes       08:00       22:00
## 2124 Abarrotes       08:00       22:00
## 2125 Abarrotes       08:00       22:00
## 2126 Abarrotes       08:00       22:00
## 2127 Abarrotes       08:00       22:00
## 2128 Abarrotes       08:00       22:00
## 2129 Abarrotes       08:00       22:00
## 2130 Abarrotes       08:00       22:00
## 2131 Abarrotes       08:00       22:00
## 2132 Abarrotes       08:00       22:00
## 2133 Abarrotes       08:00       22:00
## 2134 Abarrotes       08:00       22:00
## 2135 Abarrotes       08:00       22:00
## 2136 Abarrotes       08:00       22:00
## 2137 Abarrotes       08:00       22:00
## 2138 Abarrotes       08:00       22:00
## 2139 Abarrotes       08:00       22:00
## 2140 Abarrotes       08:00       22:00
## 2141 Abarrotes       08:00       22:00
## 2142 Abarrotes       08:00       22:00
## 2143 Abarrotes       08:00       22:00
## 2144 Abarrotes       08:00       22:00
## 2145 Abarrotes       08:00       22:00
## 2146 Abarrotes       08:00       22:00
## 2147 Abarrotes       08:00       22:00
## 2148 Abarrotes       08:00       22:00
## 2149 Abarrotes       08:00       22:00
## 2150 Abarrotes       08:00       22:00
## 2151 Abarrotes       08:00       22:00
## 2152 Abarrotes       08:00       22:00
## 2153 Abarrotes       08:00       22:00
## 2154 Abarrotes       08:00       22:00
## 2155 Abarrotes       08:00       22:00
## 2156 Abarrotes       08:00       22:00
## 2157 Abarrotes       08:00       22:00
## 2158 Abarrotes       08:00       22:00
## 2159 Abarrotes       08:00       22:00
## 2160 Abarrotes       08:00       22:00
## 2161 Abarrotes       08:00       22:00
## 2162 Abarrotes       08:00       22:00
## 2163 Abarrotes       08:00       22:00
## 2164 Abarrotes       08:00       22:00
## 2165 Abarrotes       08:00       22:00
## 2166 Abarrotes       08:00       22:00
## 2167 Abarrotes       08:00       22:00
## 2168 Abarrotes       08:00       22:00
## 2169 Abarrotes       08:00       22:00
## 2170 Abarrotes       08:00       22:00
## 2171 Abarrotes       08:00       22:00
## 2172 Abarrotes       08:00       22:00
## 2173 Abarrotes       08:00       22:00
## 2174 Abarrotes       08:00       22:00
## 2175 Abarrotes       08:00       22:00
## 2176 Abarrotes       08:00       22:00
## 2177 Abarrotes       08:00       22:00
## 2178 Abarrotes       08:00       22:00
## 2179 Abarrotes       08:00       22:00
## 2180 Abarrotes       08:00       22:00
## 2181 Abarrotes       08:00       22:00
## 2182 Abarrotes       08:00       22:00
## 2183 Abarrotes       08:00       22:00
## 2184 Abarrotes       08:00       22:00
## 2185 Abarrotes       08:00       22:00
## 2186 Abarrotes       08:00       22:00
## 2187 Abarrotes       08:00       22:00
## 2188 Abarrotes       08:00       22:00
## 2189 Abarrotes       08:00       22:00
## 2190 Abarrotes       08:00       22:00
## 2191 Abarrotes       08:00       22:00
## 2192 Abarrotes       08:00       22:00
## 2193 Abarrotes       08:00       22:00
## 2194 Abarrotes       08:00       22:00
## 2195 Abarrotes       08:00       22:00
## 2196 Abarrotes       08:00       22:00
## 2197 Abarrotes       08:00       22:00
## 2198 Abarrotes       08:00       22:00
## 2199 Abarrotes       08:00       22:00
## 2200 Abarrotes       08:00       22:00
## 2201 Abarrotes       08:00       22:00
## 2202 Abarrotes       08:00       22:00
## 2203 Abarrotes       08:00       22:00
## 2204 Abarrotes       08:00       22:00
## 2205 Abarrotes       08:00       22:00
## 2206 Abarrotes       08:00       22:00
## 2207 Abarrotes       08:00       22:00
## 2208 Abarrotes       08:00       22:00
## 2209 Abarrotes       08:00       22:00
## 2210 Abarrotes       08:00       22:00
## 2211 Abarrotes       08:00       22:00
## 2212 Abarrotes       08:00       22:00
## 2213 Abarrotes       08:00       22:00
## 2214 Abarrotes       08:00       22:00
## 2215 Abarrotes       08:00       22:00
## 2216 Abarrotes       08:00       22:00
## 2217 Abarrotes       08:00       22:00
## 2218 Abarrotes       08:00       22:00
## 2219 Abarrotes       08:00       22:00
## 2220 Abarrotes       08:00       22:00
## 2221 Abarrotes       08:00       22:00
## 2222 Abarrotes       08:00       22:00
## 2223 Abarrotes       08:00       22:00
## 2224 Abarrotes       08:00       22:00
## 2225 Abarrotes       08:00       22:00
## 2226 Abarrotes       08:00       22:00
## 2227 Abarrotes       08:00       22:00
## 2228 Abarrotes       08:00       22:00
## 2229 Abarrotes       08:00       22:00
## 2230 Abarrotes       08:00       22:00
## 2231 Abarrotes       08:00       22:00
## 2232 Abarrotes       08:00       22:00
## 2233 Abarrotes       08:00       22:00
## 2234 Abarrotes       08:00       22:00
## 2235 Abarrotes       08:00       22:00
## 2236 Abarrotes       08:00       22:00
## 2237 Abarrotes       08:00       22:00
## 2238 Abarrotes       08:00       22:00
## 2239 Abarrotes       08:00       22:00
## 2240 Abarrotes       08:00       22:00
## 2241 Abarrotes       08:00       22:00
## 2242 Abarrotes       08:00       22:00
## 2243 Abarrotes       08:00       22:00
## 2244 Abarrotes       08:00       22:00
## 2245 Abarrotes       08:00       22:00
## 2246 Abarrotes       08:00       22:00
## 2247 Abarrotes       08:00       22:00
## 2248 Abarrotes       08:00       22:00
## 2249 Abarrotes       08:00       22:00
## 2250 Abarrotes       08:00       22:00
## 2251 Abarrotes       08:00       22:00
## 2252 Abarrotes       08:00       22:00
## 2253 Abarrotes       08:00       22:00
## 2254 Abarrotes       08:00       22:00
## 2255 Abarrotes       08:00       22:00
## 2256 Abarrotes       08:00       22:00
## 2257 Abarrotes       08:00       22:00
## 2258 Abarrotes       08:00       22:00
## 2259 Abarrotes       08:00       22:00
## 2260 Abarrotes       08:00       22:00
## 2261 Abarrotes       08:00       22:00
## 2262 Abarrotes       08:00       22:00
## 2263 Abarrotes       08:00       22:00
## 2264 Abarrotes       08:00       22:00
## 2265 Abarrotes       08:00       22:00
## 2266 Abarrotes       08:00       22:00
## 2267 Abarrotes       08:00       22:00
## 2268 Abarrotes       08:00       22:00
## 2269 Abarrotes       08:00       22:00
## 2270 Abarrotes       08:00       22:00
## 2271 Abarrotes       08:00       22:00
## 2272 Abarrotes       08:00       22:00
## 2273 Abarrotes       08:00       22:00
## 2274 Abarrotes       08:00       22:00
## 2275 Abarrotes       08:00       22:00
## 2276 Abarrotes       08:00       22:00
## 2277 Abarrotes       08:00       22:00
## 2278 Abarrotes       08:00       22:00
## 2279 Abarrotes       08:00       22:00
## 2280 Abarrotes       08:00       22:00
## 2281 Abarrotes       08:00       22:00
## 2282 Abarrotes       08:00       22:00
## 2283 Abarrotes       08:00       22:00
## 2284 Abarrotes       08:00       22:00
## 2285 Abarrotes       08:00       22:00
## 2286 Abarrotes       08:00       22:00
## 2287 Abarrotes       08:00       22:00
## 2288 Abarrotes       08:00       22:00
## 2289 Abarrotes       08:00       22:00
## 2290 Abarrotes       08:00       22:00
## 2291 Abarrotes       08:00       22:00
## 2292 Abarrotes       08:00       22:00
## 2293 Abarrotes       08:00       22:00
## 2294 Abarrotes       08:00       22:00
## 2295 Abarrotes       08:00       22:00
## 2296 Abarrotes       08:00       22:00
## 2297 Abarrotes       08:00       22:00
## 2298 Abarrotes       08:00       22:00
## 2299 Abarrotes       08:00       22:00
## 2300 Abarrotes       08:00       22:00
## 2301 Abarrotes       08:00       22:00
## 2302 Abarrotes       08:00       22:00
## 2303 Abarrotes       08:00       22:00
## 2304 Abarrotes       08:00       22:00
## 2305 Abarrotes       08:00       22:00
## 2306 Abarrotes       08:00       22:00
## 2307 Abarrotes       08:00       22:00
## 2308 Abarrotes       08:00       22:00
## 2309 Abarrotes       08:00       22:00
## 2310 Abarrotes       08:00       22:00
## 2311 Abarrotes       08:00       22:00
## 2312 Abarrotes       08:00       22:00
## 2313 Abarrotes       08:00       22:00
## 2314 Abarrotes       08:00       22:00
## 2315 Abarrotes       08:00       22:00
## 2316 Abarrotes       08:00       22:00
## 2317 Abarrotes       08:00       22:00
## 2318 Abarrotes       08:00       22:00
## 2319 Abarrotes       08:00       22:00
## 2320 Abarrotes       08:00       22:00
## 2321 Abarrotes       08:00       22:00
## 2322 Abarrotes       08:00       22:00
## 2323 Abarrotes       08:00       22:00
## 2324 Abarrotes       08:00       22:00
## 2325 Abarrotes       08:00       22:00
## 2326 Abarrotes       08:00       22:00
## 2327 Abarrotes       08:00       22:00
## 2328 Abarrotes       08:00       22:00
## 2329 Abarrotes       08:00       22:00
## 2330 Abarrotes       08:00       22:00
## 2331 Abarrotes       08:00       22:00
## 2332 Abarrotes       08:00       22:00
## 2333 Abarrotes       08:00       22:00
## 2334 Abarrotes       08:00       22:00
## 2335 Abarrotes       08:00       22:00
## 2336 Abarrotes       08:00       22:00
## 2337 Abarrotes       08:00       22:00
## 2338 Abarrotes       08:00       22:00
## 2339 Abarrotes       08:00       22:00
## 2340 Abarrotes       08:00       22:00
## 2341 Abarrotes       08:00       22:00
## 2342 Abarrotes       08:00       22:00
## 2343 Abarrotes       08:00       22:00
## 2344 Abarrotes       08:00       22:00
## 2345 Abarrotes       08:00       22:00
## 2346 Abarrotes       08:00       22:00
## 2347 Abarrotes       08:00       22:00
## 2348 Abarrotes       08:00       22:00
## 2349 Abarrotes       08:00       22:00
## 2350 Abarrotes       08:00       22:00
## 2351 Abarrotes       08:00       22:00
## 2352 Abarrotes       08:00       22:00
## 2353 Abarrotes       08:00       22:00
## 2354 Abarrotes       08:00       22:00
## 2355 Abarrotes       08:00       22:00
## 2356 Abarrotes       08:00       22:00
## 2357 Abarrotes       08:00       22:00
## 2358 Abarrotes       08:00       22:00
## 2359 Abarrotes       08:00       22:00
## 2360 Abarrotes       08:00       22:00
## 2361 Abarrotes       08:00       22:00
## 2362 Abarrotes       08:00       22:00
## 2363 Abarrotes       08:00       22:00
## 2364 Abarrotes       08:00       22:00
## 2365 Abarrotes       08:00       22:00
## 2366 Abarrotes       08:00       22:00
## 2367 Abarrotes       08:00       22:00
## 2368 Abarrotes       08:00       22:00
## 2369 Abarrotes       08:00       22:00
## 2370 Abarrotes       08:00       22:00
## 2371 Abarrotes       08:00       22:00
## 2372 Abarrotes       08:00       22:00
## 2373 Abarrotes       08:00       22:00
## 2374 Abarrotes       08:00       22:00
## 2375 Abarrotes       08:00       22:00
## 2376 Abarrotes       08:00       22:00
## 2377 Abarrotes       08:00       22:00
## 2378 Abarrotes       08:00       22:00
## 2379 Abarrotes       08:00       22:00
## 2380 Abarrotes       08:00       22:00
## 2381 Abarrotes       08:00       22:00
## 2382 Abarrotes       08:00       22:00
## 2383 Abarrotes       08:00       22:00
## 2384 Abarrotes       08:00       22:00
## 2385 Abarrotes       08:00       22:00
## 2386 Abarrotes       08:00       22:00
## 2387 Abarrotes       08:00       22:00
## 2388 Abarrotes       08:00       22:00
## 2389 Abarrotes       08:00       22:00
## 2390 Abarrotes       08:00       22:00
## 2391 Abarrotes       08:00       22:00
## 2392 Abarrotes       08:00       22:00
## 2393 Abarrotes       08:00       22:00
## 2394 Abarrotes       08:00       22:00
## 2395 Abarrotes       08:00       22:00
## 2396 Abarrotes       08:00       22:00
## 2397 Abarrotes       08:00       22:00
## 2398 Abarrotes       08:00       22:00
## 2399 Abarrotes       08:00       22:00
## 2400 Abarrotes       08:00       22:00
## 2401 Abarrotes       08:00       22:00
## 2402 Abarrotes       08:00       22:00
## 2403 Abarrotes       08:00       22:00
## 2404 Abarrotes       08:00       22:00
## 2405 Abarrotes       08:00       22:00
## 2406 Abarrotes       08:00       22:00
## 2407 Abarrotes       08:00       22:00
## 2408 Abarrotes       08:00       22:00
## 2409 Abarrotes       08:00       22:00
## 2410 Abarrotes       08:00       22:00
## 2411 Abarrotes       08:00       22:00
## 2412 Abarrotes       08:00       22:00
## 2413 Abarrotes       08:00       22:00
## 2414 Abarrotes       08:00       22:00
## 2415 Abarrotes       08:00       22:00
## 2416 Abarrotes       08:00       22:00
## 2417 Abarrotes       08:00       22:00
## 2418 Abarrotes       08:00       22:00
## 2419 Abarrotes       08:00       22:00
## 2420 Abarrotes       08:00       22:00
## 2421 Abarrotes       08:00       22:00
## 2422 Abarrotes       08:00       22:00
## 2423 Abarrotes       08:00       22:00
## 2424 Abarrotes       08:00       22:00
## 2425 Abarrotes       08:00       22:00
## 2426 Abarrotes       08:00       22:00
## 2427 Abarrotes       08:00       22:00
## 2428 Abarrotes       08:00       22:00
## 2429 Abarrotes       08:00       22:00
## 2430 Abarrotes       08:00       22:00
## 2431 Abarrotes       08:00       22:00
## 2432 Abarrotes       08:00       22:00
## 2433 Abarrotes       08:00       22:00
## 2434 Abarrotes       08:00       22:00
## 2435 Abarrotes       08:00       22:00
## 2436 Abarrotes       08:00       22:00
## 2437 Abarrotes       08:00       22:00
## 2438 Abarrotes       08:00       22:00
## 2439 Abarrotes       08:00       22:00
## 2440 Abarrotes       08:00       22:00
## 2441 Abarrotes       08:00       22:00
## 2442 Abarrotes       08:00       22:00
## 2443 Abarrotes       08:00       22:00
## 2444 Abarrotes       08:00       22:00
## 2445 Abarrotes       08:00       22:00
## 2446 Abarrotes       08:00       22:00
## 2447 Abarrotes       08:00       22:00
## 2448 Abarrotes       08:00       22:00
## 2449 Abarrotes       08:00       22:00
## 2450 Abarrotes       08:00       22:00
## 2451 Abarrotes       08:00       22:00
## 2452 Abarrotes       08:00       22:00
## 2453 Abarrotes       08:00       22:00
## 2454 Abarrotes       08:00       22:00
## 2455 Abarrotes       08:00       22:00
## 2456 Abarrotes       08:00       22:00
## 2457 Abarrotes       08:00       22:00
## 2458 Abarrotes       08:00       22:00
## 2459 Abarrotes       08:00       22:00
## 2460 Abarrotes       08:00       22:00
## 2461 Abarrotes       08:00       22:00
## 2462 Abarrotes       08:00       22:00
## 2463 Abarrotes       08:00       22:00
## 2464 Abarrotes       08:00       22:00
## 2465 Abarrotes       08:00       22:00
## 2466 Abarrotes       08:00       22:00
## 2467 Abarrotes       08:00       22:00
## 2468 Abarrotes       08:00       22:00
## 2469 Abarrotes       08:00       22:00
## 2470 Abarrotes       08:00       22:00
## 2471 Abarrotes       08:00       22:00
## 2472 Abarrotes       08:00       22:00
## 2473 Abarrotes       08:00       22:00
## 2474 Abarrotes       08:00       22:00
## 2475 Abarrotes       08:00       22:00
## 2476 Abarrotes       08:00       22:00
## 2477 Abarrotes       08:00       22:00
## 2478 Abarrotes       08:00       22:00
## 2479 Abarrotes       08:00       22:00
## 2480 Abarrotes       08:00       22:00
## 2481 Abarrotes       08:00       22:00
## 2482 Abarrotes       08:00       22:00
## 2483 Abarrotes       08:00       22:00
## 2484 Abarrotes       08:00       22:00
## 2485 Abarrotes       08:00       22:00
## 2486 Abarrotes       08:00       22:00
## 2487 Abarrotes       08:00       22:00
## 2488 Abarrotes       08:00       22:00
## 2489 Abarrotes       08:00       22:00
## 2490 Abarrotes       08:00       22:00
## 2491 Abarrotes       08:00       22:00
## 2492 Abarrotes       08:00       22:00
## 2493 Abarrotes       08:00       22:00
## 2494 Abarrotes       08:00       22:00
## 2495 Abarrotes       08:00       22:00
## 2496 Abarrotes       08:00       22:00
## 2497 Abarrotes       08:00       22:00
## 2498 Abarrotes       08:00       22:00
## 2499 Abarrotes       08:00       22:00
## 2500 Abarrotes       08:00       22:00
## 2501 Abarrotes       08:00       22:00
## 2502 Abarrotes       08:00       22:00
## 2503 Abarrotes       08:00       22:00
## 2504 Abarrotes       08:00       22:00
## 2505 Abarrotes       08:00       22:00
## 2506 Abarrotes       08:00       22:00
## 2507 Abarrotes       08:00       22:00
## 2508 Abarrotes       08:00       22:00
## 2509 Abarrotes       08:00       22:00
## 2510 Abarrotes       08:00       22:00
## 2511 Abarrotes       08:00       22:00
## 2512 Abarrotes       08:00       22:00
## 2513 Abarrotes       08:00       22:00
## 2514 Abarrotes       08:00       22:00
## 2515 Abarrotes       08:00       22:00
## 2516 Abarrotes       08:00       22:00
## 2517 Abarrotes       08:00       22:00
## 2518 Abarrotes       08:00       22:00
## 2519 Abarrotes       08:00       22:00
## 2520 Abarrotes       08:00       22:00
## 2521 Abarrotes       08:00       22:00
## 2522 Abarrotes       08:00       22:00
## 2523 Abarrotes       08:00       22:00
## 2524 Abarrotes       08:00       22:00
## 2525 Abarrotes       08:00       22:00
## 2526 Abarrotes       08:00       22:00
## 2527 Abarrotes       08:00       22:00
## 2528 Abarrotes       08:00       22:00
## 2529 Abarrotes       08:00       22:00
## 2530 Abarrotes       08:00       22:00
## 2531 Abarrotes       08:00       22:00
## 2532 Abarrotes       08:00       22:00
## 2533 Abarrotes       08:00       22:00
## 2534 Abarrotes       08:00       22:00
## 2535 Abarrotes       08:00       22:00
## 2536 Abarrotes       08:00       22:00
## 2537 Abarrotes       08:00       22:00
## 2538 Abarrotes       08:00       22:00
## 2539 Abarrotes       08:00       22:00
## 2540 Abarrotes       08:00       22:00
## 2541 Abarrotes       08:00       22:00
## 2542 Abarrotes       08:00       22:00
## 2543 Abarrotes       08:00       22:00
## 2544 Abarrotes       08:00       22:00
## 2545 Abarrotes       08:00       22:00
## 2546 Abarrotes       08:00       22:00
## 2547 Abarrotes       08:00       22:00
## 2548 Abarrotes       08:00       22:00
## 2549 Abarrotes       08:00       22:00
## 2550 Abarrotes       08:00       22:00
## 2551 Abarrotes       08:00       22:00
## 2552 Abarrotes       08:00       22:00
## 2553 Abarrotes       08:00       22:00
## 2554 Abarrotes       08:00       22:00
## 2555 Abarrotes       08:00       22:00
## 2556 Abarrotes       08:00       22:00
## 2557 Abarrotes       08:00       22:00
## 2558 Abarrotes       08:00       22:00
## 2559 Abarrotes       08:00       22:00
## 2560 Abarrotes       08:00       22:00
## 2561 Abarrotes       08:00       22:00
## 2562 Abarrotes       08:00       22:00
## 2563 Abarrotes       08:00       22:00
## 2564 Abarrotes       08:00       22:00
## 2565 Abarrotes       08:00       22:00
## 2566 Abarrotes       08:00       22:00
## 2567 Abarrotes       08:00       22:00
## 2568 Abarrotes       08:00       22:00
## 2569 Abarrotes       08:00       22:00
## 2570 Abarrotes       08:00       22:00
## 2571 Abarrotes       08:00       22:00
## 2572 Abarrotes       08:00       22:00
## 2573 Abarrotes       08:00       22:00
## 2574 Abarrotes       08:00       22:00
## 2575 Abarrotes       08:00       22:00
## 2576 Abarrotes       08:00       22:00
## 2577 Abarrotes       08:00       22:00
## 2578 Abarrotes       08:00       22:00
## 2579 Abarrotes       08:00       22:00
## 2580 Abarrotes       08:00       22:00
## 2581 Abarrotes       08:00       22:00
## 2582 Abarrotes       08:00       22:00
## 2583 Abarrotes       08:00       22:00
## 2584 Abarrotes       08:00       22:00
## 2585 Abarrotes       08:00       22:00
## 2586 Abarrotes       08:00       22:00
## 2587 Abarrotes       08:00       22:00
## 2588 Abarrotes       08:00       22:00
## 2589 Abarrotes       08:00       22:00
## 2590 Abarrotes       08:00       22:00
## 2591 Abarrotes       08:00       22:00
## 2592 Abarrotes       08:00       22:00
## 2593 Abarrotes       08:00       22:00
## 2594 Abarrotes       08:00       22:00
## 2595 Abarrotes       08:00       22:00
## 2596 Abarrotes       08:00       22:00
## 2597 Abarrotes       08:00       22:00
## 2598 Abarrotes       08:00       22:00
## 2599 Abarrotes       08:00       22:00
## 2600 Abarrotes       08:00       22:00
## 2601 Abarrotes       08:00       22:00
## 2602 Abarrotes       08:00       22:00
## 2603 Abarrotes       08:00       22:00
## 2604 Abarrotes       08:00       22:00
## 2605 Abarrotes       08:00       22:00
## 2606 Abarrotes       08:00       22:00
## 2607 Abarrotes       08:00       22:00
## 2608 Abarrotes       08:00       22:00
## 2609 Abarrotes       08:00       22:00
## 2610 Abarrotes       08:00       22:00
## 2611 Abarrotes       08:00       22:00
## 2612 Abarrotes       08:00       22:00
## 2613 Abarrotes       08:00       22:00
## 2614 Abarrotes       08:00       22:00
## 2615 Abarrotes       08:00       22:00
## 2616 Abarrotes       08:00       22:00
## 2617 Abarrotes       08:00       22:00
## 2618 Abarrotes       08:00       22:00
## 2619 Abarrotes       08:00       22:00
## 2620 Abarrotes       08:00       22:00
## 2621 Abarrotes       08:00       22:00
## 2622 Abarrotes       08:00       22:00
## 2623 Abarrotes       08:00       22:00
## 2624 Abarrotes       08:00       22:00
## 2625 Abarrotes       08:00       22:00
## 2626 Abarrotes       08:00       22:00
## 2627 Abarrotes       08:00       22:00
## 2628 Abarrotes       08:00       22:00
## 2629 Abarrotes       08:00       22:00
## 2630 Abarrotes       08:00       22:00
## 2631 Abarrotes       08:00       22:00
## 2632 Abarrotes       08:00       22:00
## 2633 Abarrotes       08:00       22:00
## 2634 Abarrotes       08:00       22:00
## 2635 Abarrotes       08:00       22:00
## 2636 Abarrotes       08:00       22:00
## 2637 Abarrotes       08:00       22:00
## 2638 Abarrotes       08:00       22:00
## 2639 Abarrotes       08:00       22:00
## 2640 Abarrotes       08:00       22:00
## 2641 Abarrotes       08:00       22:00
## 2642 Abarrotes       08:00       22:00
## 2643 Abarrotes       08:00       22:00
## 2644 Abarrotes       08:00       22:00
## 2645 Abarrotes       08:00       22:00
## 2646 Abarrotes       08:00       22:00
## 2647 Abarrotes       08:00       22:00
## 2648 Abarrotes       08:00       22:00
## 2649 Abarrotes       08:00       22:00
## 2650 Abarrotes       08:00       22:00
## 2651 Abarrotes       08:00       22:00
## 2652 Abarrotes       08:00       22:00
## 2653 Abarrotes       08:00       22:00
## 2654 Abarrotes       08:00       22:00
## 2655 Abarrotes       08:00       22:00
## 2656 Abarrotes       08:00       22:00
## 2657 Abarrotes       08:00       22:00
## 2658 Abarrotes       08:00       22:00
## 2659 Abarrotes       08:00       22:00
## 2660 Abarrotes       08:00       22:00
## 2661 Abarrotes       08:00       22:00
## 2662 Abarrotes       08:00       22:00
## 2663 Abarrotes       08:00       22:00
## 2664 Abarrotes       08:00       22:00
## 2665 Abarrotes       08:00       22:00
## 2666 Abarrotes       08:00       22:00
## 2667 Abarrotes       08:00       22:00
## 2668 Abarrotes       08:00       22:00
## 2669 Abarrotes       08:00       22:00
## 2670 Abarrotes       08:00       22:00
## 2671 Abarrotes       08:00       22:00
## 2672 Abarrotes       08:00       22:00
## 2673 Abarrotes       08:00       22:00
## 2674 Abarrotes       08:00       22:00
## 2675 Abarrotes       08:00       22:00
## 2676 Abarrotes       08:00       22:00
## 2677 Abarrotes       08:00       22:00
## 2678 Abarrotes       08:00       22:00
## 2679 Abarrotes       08:00       22:00
## 2680 Abarrotes       08:00       22:00
## 2681 Abarrotes       08:00       22:00
## 2682 Abarrotes       08:00       22:00
## 2683 Abarrotes       08:00       22:00
## 2684 Abarrotes       08:00       22:00
## 2685 Abarrotes       08:00       22:00
## 2686 Abarrotes       08:00       22:00
## 2687 Abarrotes       08:00       22:00
## 2688 Abarrotes       08:00       22:00
## 2689 Abarrotes       08:00       22:00
## 2690 Abarrotes       08:00       22:00
## 2691 Abarrotes       08:00       22:00
## 2692 Abarrotes       08:00       22:00
## 2693 Abarrotes       08:00       22:00
## 2694 Abarrotes       08:00       22:00
## 2695 Abarrotes       08:00       22:00
## 2696 Abarrotes       08:00       22:00
## 2697 Abarrotes       08:00       22:00
## 2698 Abarrotes       08:00       22:00
## 2699 Abarrotes       08:00       22:00
## 2700 Abarrotes       08:00       22:00
## 2701 Abarrotes       08:00       22:00
## 2702 Abarrotes       08:00       22:00
## 2703 Abarrotes       08:00       22:00
## 2704 Abarrotes       08:00       22:00
## 2705 Abarrotes       08:00       22:00
## 2706 Abarrotes       08:00       22:00
## 2707 Abarrotes       08:00       22:00
## 2708 Abarrotes       08:00       22:00
## 2709 Abarrotes       08:00       22:00
## 2710 Abarrotes       08:00       22:00
## 2711 Abarrotes       08:00       22:00
## 2712 Abarrotes       08:00       22:00
## 2713 Abarrotes       08:00       22:00
## 2714 Abarrotes       08:00       22:00
## 2715 Abarrotes       08:00       22:00
## 2716 Abarrotes       08:00       22:00
## 2717 Abarrotes       08:00       22:00
## 2718 Abarrotes       08:00       22:00
## 2719 Abarrotes       08:00       22:00
## 2720 Abarrotes       08:00       22:00
## 2721 Abarrotes       08:00       22:00
## 2722 Abarrotes       08:00       22:00
## 2723 Abarrotes       08:00       22:00
## 2724 Abarrotes       08:00       22:00
## 2725 Abarrotes       08:00       22:00
## 2726 Abarrotes       08:00       22:00
## 2727 Abarrotes       08:00       22:00
## 2728 Abarrotes       08:00       22:00
## 2729 Abarrotes       08:00       22:00
## 2730 Abarrotes       08:00       22:00
## 2731 Abarrotes       08:00       22:00
## 2732 Abarrotes       08:00       22:00
## 2733 Abarrotes       08:00       22:00
## 2734 Abarrotes       08:00       22:00
## 2735 Abarrotes       08:00       22:00
## 2736 Abarrotes       08:00       22:00
## 2737 Abarrotes       08:00       22:00
## 2738 Abarrotes       08:00       22:00
## 2739 Abarrotes       08:00       22:00
## 2740 Abarrotes       08:00       22:00
## 2741 Abarrotes       08:00       22:00
## 2742 Abarrotes       08:00       22:00
## 2743 Abarrotes       08:00       22:00
## 2744 Abarrotes       08:00       22:00
## 2745 Abarrotes       08:00       22:00
## 2746 Abarrotes       08:00       22:00
## 2747 Abarrotes       08:00       22:00
## 2748 Abarrotes       08:00       22:00
## 2749 Abarrotes       08:00       22:00
## 2750 Abarrotes       08:00       22:00
## 2751 Abarrotes       08:00       22:00
## 2752 Abarrotes       08:00       22:00
## 2753 Abarrotes       08:00       22:00
## 2754 Abarrotes       08:00       22:00
## 2755 Abarrotes       08:00       22:00
## 2756 Abarrotes       08:00       22:00
## 2757 Abarrotes       08:00       22:00
## 2758 Abarrotes       08:00       22:00
## 2759 Abarrotes       08:00       22:00
## 2760 Abarrotes       08:00       22:00
## 2761 Abarrotes       08:00       22:00
## 2762 Abarrotes       08:00       22:00
## 2763 Abarrotes       08:00       22:00
## 2764 Abarrotes       08:00       22:00
## 2765 Abarrotes       08:00       22:00
## 2766 Abarrotes       08:00       22:00
## 2767 Abarrotes       08:00       22:00
## 2768 Abarrotes       08:00       22:00
## 2769 Abarrotes       08:00       22:00
## 2770 Abarrotes       08:00       22:00
## 2771 Abarrotes       08:00       22:00
## 2772 Abarrotes       08:00       22:00
## 2773 Abarrotes       08:00       22:00
## 2774 Abarrotes       08:00       22:00
## 2775 Abarrotes       08:00       22:00
## 2776 Abarrotes       08:00       22:00
## 2777 Abarrotes       08:00       22:00
## 2778 Abarrotes       08:00       22:00
## 2779 Abarrotes       08:00       22:00
## 2780 Abarrotes       08:00       22:00
## 2781 Abarrotes       08:00       22:00
## 2782 Abarrotes       08:00       22:00
## 2783 Abarrotes       08:00       22:00
## 2784 Abarrotes       08:00       22:00
## 2785 Abarrotes       08:00       22:00
## 2786 Abarrotes       08:00       22:00
## 2787 Abarrotes       08:00       22:00
## 2788 Abarrotes       08:00       22:00
## 2789 Abarrotes       08:00       22:00
## 2790 Abarrotes       08:00       22:00
## 2791 Abarrotes       08:00       22:00
## 2792 Abarrotes       08:00       22:00
## 2793 Abarrotes       08:00       22:00
## 2794 Abarrotes       08:00       22:00
## 2795 Abarrotes       08:00       22:00
## 2796 Abarrotes       08:00       22:00
## 2797 Abarrotes       08:00       22:00
## 2798 Abarrotes       08:00       22:00
## 2799 Abarrotes       08:00       22:00
## 2800 Abarrotes       08:00       22:00
## 2801 Abarrotes       08:00       22:00
## 2802 Abarrotes       08:00       22:00
## 2803 Abarrotes       08:00       22:00
## 2804 Abarrotes       08:00       22:00
## 2805 Abarrotes       08:00       22:00
## 2806 Abarrotes       08:00       22:00
## 2807 Abarrotes       08:00       22:00
## 2808 Abarrotes       08:00       22:00
## 2809 Abarrotes       08:00       22:00
## 2810 Abarrotes       08:00       22:00
## 2811 Abarrotes       08:00       22:00
## 2812 Abarrotes       08:00       22:00
## 2813 Abarrotes       08:00       22:00
## 2814 Abarrotes       08:00       22:00
## 2815 Abarrotes       08:00       22:00
## 2816 Abarrotes       08:00       22:00
## 2817 Abarrotes       08:00       22:00
## 2818 Abarrotes       08:00       22:00
## 2819 Abarrotes       08:00       22:00
## 2820 Abarrotes       08:00       22:00
## 2821 Abarrotes       08:00       22:00
## 2822 Abarrotes       08:00       22:00
## 2823 Abarrotes       08:00       22:00
## 2824 Abarrotes       08:00       22:00
## 2825 Abarrotes       08:00       22:00
## 2826 Abarrotes       08:00       22:00
## 2827 Abarrotes       08:00       22:00
## 2828 Abarrotes       08:00       22:00
## 2829 Abarrotes       08:00       22:00
## 2830 Abarrotes       08:00       22:00
## 2831 Abarrotes       08:00       22:00
## 2832 Abarrotes       08:00       22:00
## 2833 Abarrotes       08:00       22:00
## 2834 Abarrotes       08:00       22:00
## 2835 Abarrotes       08:00       22:00
## 2836 Abarrotes       08:00       22:00
## 2837 Abarrotes       08:00       22:00
## 2838 Abarrotes       08:00       22:00
## 2839 Abarrotes       08:00       22:00
## 2840 Abarrotes       08:00       22:00
## 2841 Abarrotes       08:00       22:00
## 2842 Abarrotes       08:00       22:00
## 2843 Abarrotes       08:00       22:00
## 2844 Abarrotes       08:00       22:00
## 2845 Abarrotes       08:00       22:00
## 2846 Abarrotes       08:00       22:00
## 2847 Abarrotes       08:00       22:00
## 2848 Abarrotes       08:00       22:00
## 2849 Abarrotes       08:00       22:00
## 2850 Abarrotes       08:00       22:00
## 2851 Abarrotes       08:00       22:00
## 2852 Abarrotes       08:00       22:00
## 2853 Abarrotes       08:00       22:00
## 2854 Abarrotes       08:00       22:00
## 2855 Abarrotes       08:00       22:00
## 2856 Abarrotes       08:00       22:00
## 2857 Abarrotes       08:00       22:00
## 2858 Abarrotes       08:00       22:00
## 2859 Abarrotes       08:00       22:00
## 2860 Abarrotes       08:00       22:00
## 2861 Abarrotes       08:00       22:00
## 2862 Abarrotes       08:00       22:00
## 2863 Abarrotes       08:00       22:00
## 2864 Abarrotes       08:00       22:00
## 2865 Abarrotes       08:00       22:00
## 2866 Abarrotes       08:00       22:00
## 2867 Abarrotes       08:00       22:00
## 2868 Abarrotes       08:00       22:00
## 2869 Abarrotes       08:00       22:00
## 2870 Abarrotes       08:00       22:00
## 2871 Abarrotes       08:00       22:00
## 2872 Abarrotes       08:00       22:00
## 2873 Abarrotes       08:00       22:00
## 2874 Abarrotes       08:00       22:00
## 2875 Abarrotes       08:00       22:00
## 2876 Abarrotes       08:00       22:00
## 2877 Abarrotes       08:00       22:00
## 2878 Abarrotes       08:00       22:00
## 2879 Abarrotes       08:00       22:00
## 2880 Abarrotes       08:00       22:00
## 2881 Abarrotes       08:00       22:00
## 2882 Abarrotes       08:00       22:00
## 2883 Abarrotes       08:00       22:00
## 2884 Abarrotes       08:00       22:00
## 2885 Abarrotes       08:00       22:00
## 2886 Abarrotes       08:00       22:00
## 2887 Abarrotes       08:00       22:00
## 2888 Abarrotes       08:00       22:00
## 2889 Abarrotes       08:00       22:00
## 2890 Abarrotes       08:00       22:00
## 2891 Abarrotes       08:00       22:00
## 2892 Abarrotes       08:00       22:00
## 2893 Abarrotes       08:00       22:00
## 2894 Abarrotes       08:00       22:00
## 2895 Abarrotes       08:00       22:00
## 2896 Abarrotes       08:00       22:00
## 2897 Abarrotes       08:00       22:00
## 2898 Abarrotes       08:00       22:00
## 2899 Abarrotes       08:00       22:00
## 2900 Abarrotes       08:00       22:00
## 2901 Abarrotes       08:00       22:00
## 2902 Abarrotes       08:00       22:00
## 2903 Abarrotes       08:00       22:00
## 2904 Abarrotes       08:00       22:00
## 2905 Abarrotes       08:00       22:00
## 2906 Abarrotes       08:00       22:00
## 2907 Abarrotes       08:00       22:00
## 2908 Abarrotes       08:00       22:00
## 2909 Abarrotes       08:00       22:00
## 2910 Abarrotes       08:00       22:00
## 2911 Abarrotes       08:00       22:00
## 2912 Abarrotes       08:00       22:00
## 2913 Abarrotes       08:00       22:00
## 2914 Abarrotes       08:00       22:00
## 2915 Abarrotes       08:00       22:00
## 2916 Abarrotes       08:00       22:00
## 2917 Abarrotes       08:00       22:00
## 2918 Abarrotes       08:00       22:00
## 2919 Abarrotes       08:00       22:00
## 2920 Abarrotes       08:00       22:00
## 2921 Abarrotes       08:00       22:00
## 2922 Abarrotes       08:00       22:00
## 2923 Abarrotes       08:00       22:00
## 2924 Abarrotes       08:00       22:00
## 2925 Abarrotes       08:00       22:00
## 2926 Abarrotes       08:00       22:00
## 2927 Abarrotes       08:00       22:00
## 2928 Abarrotes       08:00       22:00
## 2929 Abarrotes       08:00       22:00
## 2930 Abarrotes       08:00       22:00
## 2931 Abarrotes       08:00       22:00
## 2932 Abarrotes       08:00       22:00
## 2933 Abarrotes       08:00       22:00
## 2934 Abarrotes       08:00       22:00
## 2935 Abarrotes       08:00       22:00
## 2936 Abarrotes       08:00       22:00
## 2937 Abarrotes       08:00       22:00
## 2938 Abarrotes       08:00       22:00
## 2939 Abarrotes       08:00       22:00
## 2940 Abarrotes       08:00       22:00
## 2941 Abarrotes       08:00       22:00
## 2942 Abarrotes       08:00       22:00
## 2943 Abarrotes       08:00       22:00
## 2944 Abarrotes       08:00       22:00
## 2945 Abarrotes       08:00       22:00
## 2946 Abarrotes       08:00       22:00
## 2947 Abarrotes       08:00       22:00
## 2948 Abarrotes       08:00       22:00
## 2949 Abarrotes       08:00       22:00
## 2950 Abarrotes       08:00       22:00
## 2951 Abarrotes       08:00       22:00
## 2952 Abarrotes       08:00       22:00
## 2953 Abarrotes       08:00       22:00
## 2954 Abarrotes       08:00       22:00
## 2955 Abarrotes       08:00       22:00
## 2956 Abarrotes       08:00       22:00
## 2957 Abarrotes       08:00       22:00
## 2958 Abarrotes       08:00       22:00
## 2959 Abarrotes       08:00       22:00
## 2960 Abarrotes       08:00       22:00
## 2961 Abarrotes       08:00       22:00
## 2962 Abarrotes       08:00       22:00
## 2963 Abarrotes       08:00       22:00
## 2964 Abarrotes       08:00       22:00
## 2965 Abarrotes       08:00       22:00
## 2966 Abarrotes       08:00       22:00
## 2967 Abarrotes       08:00       22:00
## 2968 Abarrotes       08:00       22:00
## 2969 Abarrotes       08:00       22:00
## 2970 Abarrotes       08:00       22:00
## 2971 Abarrotes       08:00       22:00
## 2972 Abarrotes       08:00       22:00
## 2973 Abarrotes       08:00       22:00
## 2974 Abarrotes       08:00       22:00
## 2975 Abarrotes       08:00       22:00
## 2976 Abarrotes       08:00       22:00
## 2977 Abarrotes       08:00       22:00
## 2978 Abarrotes       08:00       22:00
## 2979 Abarrotes       08:00       22:00
## 2980 Abarrotes       08:00       22:00
## 2981 Abarrotes       08:00       22:00
## 2982 Abarrotes       08:00       22:00
## 2983 Abarrotes       08:00       22:00
## 2984 Abarrotes       08:00       22:00
## 2985 Abarrotes       08:00       22:00
## 2986 Abarrotes       08:00       22:00
## 2987 Abarrotes       08:00       22:00
## 2988 Abarrotes       08:00       22:00
## 2989 Abarrotes       08:00       22:00
## 2990 Abarrotes       08:00       22:00
## 2991 Abarrotes       08:00       22:00
## 2992 Abarrotes       08:00       22:00
## 2993 Abarrotes       08:00       22:00
## 2994 Abarrotes       08:00       22:00
## 2995 Abarrotes       08:00       22:00
## 2996 Abarrotes       08:00       22:00
## 2997 Abarrotes       08:00       22:00
## 2998 Abarrotes       08:00       22:00
## 2999 Abarrotes       08:00       22:00
## 3000 Abarrotes       08:00       22:00
## 3001 Abarrotes       08:00       22:00
## 3002 Abarrotes       08:00       22:00
## 3003 Abarrotes       08:00       22:00
## 3004 Abarrotes       08:00       22:00
## 3005 Abarrotes       08:00       22:00
## 3006 Abarrotes       08:00       22:00
## 3007 Abarrotes       08:00       22:00
## 3008 Abarrotes       08:00       22:00
## 3009 Abarrotes       08:00       22:00
## 3010 Abarrotes       08:00       22:00
## 3011 Abarrotes       08:00       22:00
## 3012 Abarrotes       08:00       22:00
## 3013 Abarrotes       08:00       22:00
## 3014 Abarrotes       08:00       22:00
## 3015 Abarrotes       08:00       22:00
## 3016 Abarrotes       08:00       22:00
## 3017 Abarrotes       08:00       22:00
## 3018 Abarrotes       08:00       22:00
## 3019 Abarrotes       08:00       22:00
## 3020 Abarrotes       08:00       22:00
## 3021 Abarrotes       08:00       22:00
## 3022 Abarrotes       08:00       22:00
## 3023 Abarrotes       08:00       22:00
## 3024 Abarrotes       08:00       22:00
## 3025 Abarrotes       08:00       22:00
## 3026 Abarrotes       08:00       22:00
## 3027 Abarrotes       08:00       22:00
## 3028 Abarrotes       08:00       22:00
## 3029 Abarrotes       08:00       22:00
## 3030 Abarrotes       08:00       22:00
## 3031 Abarrotes       08:00       22:00
## 3032 Abarrotes       08:00       22:00
## 3033 Abarrotes       08:00       22:00
## 3034 Abarrotes       08:00       22:00
## 3035 Abarrotes       08:00       22:00
## 3036 Abarrotes       08:00       22:00
## 3037 Abarrotes       08:00       22:00
## 3038 Abarrotes       08:00       22:00
## 3039 Abarrotes       08:00       22:00
## 3040 Abarrotes       08:00       22:00
## 3041 Abarrotes       08:00       22:00
## 3042 Abarrotes       08:00       22:00
## 3043 Abarrotes       08:00       22:00
## 3044 Abarrotes       08:00       22:00
## 3045 Abarrotes       08:00       22:00
## 3046 Abarrotes       08:00       22:00
## 3047 Abarrotes       08:00       22:00
## 3048 Abarrotes       08:00       22:00
## 3049 Abarrotes       08:00       22:00
## 3050 Abarrotes       08:00       22:00
## 3051 Abarrotes       08:00       22:00
## 3052 Abarrotes       08:00       22:00
## 3053 Abarrotes       08:00       22:00
## 3054 Abarrotes       08:00       22:00
## 3055 Abarrotes       08:00       22:00
## 3056 Abarrotes       08:00       22:00
## 3057 Abarrotes       08:00       22:00
## 3058 Abarrotes       08:00       22:00
## 3059 Abarrotes       08:00       22:00
## 3060 Abarrotes       08:00       22:00
## 3061 Abarrotes       08:00       22:00
## 3062 Abarrotes       08:00       22:00
## 3063 Abarrotes       08:00       22:00
## 3064 Abarrotes       08:00       22:00
## 3065 Abarrotes       08:00       22:00
## 3066 Abarrotes       08:00       22:00
## 3067 Abarrotes       08:00       22:00
## 3068 Abarrotes       08:00       22:00
## 3069 Abarrotes       08:00       22:00
## 3070 Abarrotes       08:00       22:00
## 3071 Abarrotes       08:00       22:00
## 3072 Abarrotes       08:00       22:00
## 3073 Abarrotes       08:00       22:00
## 3074 Abarrotes       08:00       22:00
## 3075 Abarrotes       08:00       22:00
## 3076 Abarrotes       08:00       22:00
## 3077 Abarrotes       08:00       22:00
## 3078 Abarrotes       08:00       22:00
## 3079 Abarrotes       08:00       22:00
## 3080 Abarrotes       08:00       22:00
## 3081 Abarrotes       08:00       22:00
## 3082 Abarrotes       08:00       22:00
## 3083 Abarrotes       08:00       22:00
## 3084 Abarrotes       08:00       22:00
## 3085 Abarrotes       08:00       22:00
## 3086 Abarrotes       08:00       22:00
## 3087 Abarrotes       08:00       22:00
## 3088 Abarrotes       08:00       22:00
## 3089 Abarrotes       08:00       22:00
## 3090 Abarrotes       08:00       22:00
## 3091 Abarrotes       08:00       22:00
## 3092 Abarrotes       08:00       22:00
## 3093 Abarrotes       08:00       22:00
## 3094 Abarrotes       08:00       22:00
## 3095 Abarrotes       08:00       22:00
## 3096 Abarrotes       08:00       22:00
## 3097 Abarrotes       08:00       22:00
## 3098 Abarrotes       08:00       22:00
## 3099 Abarrotes       08:00       22:00
## 3100 Abarrotes       08:00       22:00
## 3101 Abarrotes       08:00       22:00
## 3102 Abarrotes       08:00       22:00
## 3103 Abarrotes       08:00       22:00
## 3104 Abarrotes       08:00       22:00
## 3105 Abarrotes       08:00       22:00
## 3106 Abarrotes       08:00       22:00
## 3107 Abarrotes       08:00       22:00
## 3108 Abarrotes       08:00       22:00
## 3109 Abarrotes       08:00       22:00
## 3110 Abarrotes       08:00       22:00
## 3111 Abarrotes       08:00       22:00
## 3112 Abarrotes       08:00       22:00
## 3113 Abarrotes       08:00       22:00
## 3114 Abarrotes       08:00       22:00
## 3115 Abarrotes       08:00       22:00
## 3116 Abarrotes       08:00       22:00
## 3117 Abarrotes       08:00       22:00
## 3118 Abarrotes       08:00       22:00
## 3119 Abarrotes       08:00       22:00
## 3120 Abarrotes       08:00       22:00
## 3121 Abarrotes       08:00       22:00
## 3122 Abarrotes       08:00       22:00
## 3123 Abarrotes       08:00       22:00
## 3124 Abarrotes       08:00       22:00
## 3125 Abarrotes       08:00       22:00
## 3126 Abarrotes       08:00       22:00
## 3127 Abarrotes       08:00       22:00
## 3128 Abarrotes       08:00       22:00
## 3129 Abarrotes       08:00       22:00
## 3130 Abarrotes       08:00       22:00
## 3131 Abarrotes       08:00       22:00
## 3132 Abarrotes       08:00       22:00
## 3133 Abarrotes       08:00       22:00
## 3134 Abarrotes       08:00       22:00
## 3135 Abarrotes       08:00       22:00
## 3136 Abarrotes       08:00       22:00
## 3137 Abarrotes       08:00       22:00
## 3138 Abarrotes       08:00       22:00
## 3139 Abarrotes       08:00       22:00
## 3140 Abarrotes       08:00       22:00
## 3141 Abarrotes       08:00       22:00
## 3142 Abarrotes       08:00       22:00
## 3143 Abarrotes       08:00       22:00
## 3144 Abarrotes       08:00       22:00
## 3145 Abarrotes       08:00       22:00
## 3146 Abarrotes       08:00       22:00
## 3147 Abarrotes       08:00       22:00
## 3148 Abarrotes       08:00       22:00
## 3149 Abarrotes       08:00       22:00
## 3150 Abarrotes       08:00       22:00
## 3151 Abarrotes       08:00       22:00
## 3152 Abarrotes       08:00       22:00
## 3153 Abarrotes       08:00       22:00
## 3154 Abarrotes       08:00       22:00
## 3155 Abarrotes       08:00       22:00
## 3156 Abarrotes       08:00       22:00
## 3157 Abarrotes       08:00       22:00
## 3158 Abarrotes       08:00       22:00
## 3159 Abarrotes       08:00       22:00
## 3160 Abarrotes       08:00       22:00
## 3161 Abarrotes       08:00       22:00
## 3162 Abarrotes       08:00       22:00
## 3163 Abarrotes       08:00       22:00
## 3164 Abarrotes       08:00       22:00
## 3165 Abarrotes       08:00       22:00
## 3166 Abarrotes       08:00       22:00
## 3167 Abarrotes       08:00       22:00
## 3168 Abarrotes       08:00       22:00
## 3169 Abarrotes       08:00       22:00
## 3170 Abarrotes       08:00       22:00
## 3171 Abarrotes       08:00       22:00
## 3172 Abarrotes       08:00       22:00
## 3173 Abarrotes       08:00       22:00
## 3174 Abarrotes       08:00       22:00
## 3175 Abarrotes       08:00       22:00
## 3176 Abarrotes       08:00       22:00
## 3177 Abarrotes       08:00       22:00
## 3178 Abarrotes       08:00       22:00
## 3179 Abarrotes       08:00       22:00
## 3180 Abarrotes       08:00       22:00
## 3181 Abarrotes       08:00       22:00
## 3182 Abarrotes       08:00       22:00
## 3183 Abarrotes       08:00       22:00
## 3184 Abarrotes       08:00       22:00
## 3185 Abarrotes       08:00       22:00
## 3186 Abarrotes       08:00       22:00
## 3187 Abarrotes       08:00       22:00
## 3188 Abarrotes       08:00       22:00
## 3189 Abarrotes       08:00       22:00
## 3190 Abarrotes       08:00       22:00
## 3191 Abarrotes       08:00       22:00
## 3192 Abarrotes       08:00       22:00
## 3193 Abarrotes       08:00       22:00
## 3194 Abarrotes       08:00       22:00
## 3195 Abarrotes       08:00       22:00
## 3196 Abarrotes       08:00       22:00
## 3197 Abarrotes       08:00       22:00
## 3198 Abarrotes       08:00       22:00
## 3199 Abarrotes       08:00       22:00
## 3200 Abarrotes       08:00       22:00
## 3201 Abarrotes       08:00       22:00
## 3202 Abarrotes       08:00       22:00
## 3203 Abarrotes       08:00       22:00
## 3204 Abarrotes       08:00       22:00
## 3205 Abarrotes       08:00       22:00
## 3206 Abarrotes       08:00       22:00
## 3207 Abarrotes       08:00       22:00
## 3208 Abarrotes       08:00       22:00
## 3209 Abarrotes       08:00       22:00
## 3210 Abarrotes       08:00       22:00
## 3211 Abarrotes       08:00       22:00
## 3212 Abarrotes       08:00       22:00
## 3213 Abarrotes       08:00       22:00
## 3214 Abarrotes       08:00       22:00
## 3215 Abarrotes       08:00       22:00
## 3216 Abarrotes       08:00       22:00
## 3217 Abarrotes       08:00       22:00
## 3218 Abarrotes       08:00       22:00
## 3219 Abarrotes       08:00       22:00
## 3220 Abarrotes       08:00       22:00
## 3221 Abarrotes       08:00       22:00
## 3222 Abarrotes       08:00       22:00
## 3223 Abarrotes       08:00       22:00
## 3224 Abarrotes       08:00       22:00
## 3225 Abarrotes       08:00       22:00
## 3226 Abarrotes       08:00       22:00
## 3227 Abarrotes       08:00       22:00
## 3228 Abarrotes       08:00       22:00
## 3229 Abarrotes       08:00       22:00
## 3230 Abarrotes       08:00       22:00
## 3231 Abarrotes       08:00       22:00
## 3232 Abarrotes       08:00       22:00
## 3233 Abarrotes       08:00       22:00
## 3234 Abarrotes       08:00       22:00
## 3235 Abarrotes       08:00       22:00
## 3236 Abarrotes       08:00       22:00
## 3237 Abarrotes       08:00       22:00
## 3238 Abarrotes       08:00       22:00
## 3239 Abarrotes       08:00       22:00
## 3240 Abarrotes       08:00       22:00
## 3241 Abarrotes       08:00       22:00
## 3242 Abarrotes       08:00       22:00
## 3243 Abarrotes       08:00       22:00
## 3244 Abarrotes       08:00       22:00
## 3245 Abarrotes       08:00       22:00
## 3246 Abarrotes       08:00       22:00
## 3247 Abarrotes       08:00       22:00
## 3248 Abarrotes       08:00       22:00
## 3249 Abarrotes       08:00       22:00
## 3250 Abarrotes       08:00       22:00
## 3251 Abarrotes       08:00       22:00
## 3252 Abarrotes       08:00       22:00
## 3253 Abarrotes       08:00       22:00
## 3254 Abarrotes       08:00       22:00
## 3255 Abarrotes       08:00       22:00
## 3256 Abarrotes       08:00       22:00
## 3257 Abarrotes       08:00       22:00
## 3258 Abarrotes       08:00       22:00
## 3259 Abarrotes       08:00       22:00
## 3260 Abarrotes       08:00       22:00
## 3261 Abarrotes       08:00       22:00
## 3262 Abarrotes       08:00       22:00
## 3263 Abarrotes       08:00       22:00
## 3264 Abarrotes       08:00       22:00
## 3265 Abarrotes       08:00       22:00
## 3266 Abarrotes       08:00       22:00
## 3267 Abarrotes       08:00       22:00
## 3268 Abarrotes       08:00       22:00
## 3269 Abarrotes       08:00       22:00
## 3270 Abarrotes       08:00       22:00
## 3271 Abarrotes       08:00       22:00
## 3272 Abarrotes       08:00       22:00
## 3273 Abarrotes       08:00       22:00
## 3274 Abarrotes       08:00       22:00
## 3275 Abarrotes       08:00       22:00
## 3276 Abarrotes       08:00       22:00
## 3277 Abarrotes       08:00       22:00
## 3278 Abarrotes       08:00       22:00
## 3279 Abarrotes       08:00       22:00
## 3280 Abarrotes       08:00       22:00
## 3281 Abarrotes       08:00       22:00
## 3282 Abarrotes       08:00       22:00
## 3283 Abarrotes       08:00       22:00
## 3284 Abarrotes       08:00       22:00
## 3285 Abarrotes       08:00       22:00
## 3286 Abarrotes       08:00       22:00
## 3287 Abarrotes       08:00       22:00
## 3288 Abarrotes       08:00       22:00
## 3289 Abarrotes       08:00       22:00
## 3290 Abarrotes       08:00       22:00
## 3291 Abarrotes       08:00       22:00
## 3292 Abarrotes       08:00       22:00
## 3293 Abarrotes       08:00       22:00
## 3294 Abarrotes       08:00       22:00
## 3295 Abarrotes       08:00       22:00
## 3296 Abarrotes       08:00       22:00
## 3297 Abarrotes       08:00       22:00
## 3298 Abarrotes       08:00       22:00
## 3299 Abarrotes       08:00       22:00
## 3300 Abarrotes       08:00       22:00
## 3301 Abarrotes       08:00       22:00
## 3302 Abarrotes       08:00       22:00
## 3303 Abarrotes       08:00       22:00
## 3304 Abarrotes       08:00       22:00
## 3305 Abarrotes       08:00       22:00
## 3306 Abarrotes       08:00       22:00
## 3307 Abarrotes       08:00       22:00
## 3308 Abarrotes       08:00       22:00
## 3309 Abarrotes       08:00       22:00
## 3310 Abarrotes       08:00       22:00
## 3311 Abarrotes       08:00       22:00
## 3312 Abarrotes       08:00       22:00
## 3313 Abarrotes       08:00       22:00
## 3314 Abarrotes       08:00       22:00
## 3315 Abarrotes       08:00       22:00
## 3316 Abarrotes       08:00       22:00
## 3317 Abarrotes       08:00       22:00
## 3318 Abarrotes       08:00       22:00
## 3319 Abarrotes       08:00       22:00
## 3320 Abarrotes       08:00       22:00
## 3321 Abarrotes       08:00       22:00
## 3322 Abarrotes       08:00       22:00
## 3323 Abarrotes       08:00       22:00
## 3324 Abarrotes       08:00       22:00
## 3325 Abarrotes       08:00       22:00
## 3326 Abarrotes       08:00       22:00
## 3327 Abarrotes       08:00       22:00
## 3328 Abarrotes       08:00       22:00
## 3329 Abarrotes       08:00       22:00
## 3330 Abarrotes       08:00       22:00
## 3331 Abarrotes       08:00       22:00
## 3332 Abarrotes       08:00       22:00
## 3333 Abarrotes       08:00       22:00
## 3334 Abarrotes       08:00       22:00
## 3335 Abarrotes       08:00       22:00
## 3336 Abarrotes       08:00       22:00
## 3337 Abarrotes       08:00       22:00
## 3338 Abarrotes       08:00       22:00
## 3339 Abarrotes       08:00       22:00
## 3340 Abarrotes       08:00       22:00
## 3341 Abarrotes       08:00       22:00
## 3342 Abarrotes       08:00       22:00
## 3343 Abarrotes       08:00       22:00
## 3344 Abarrotes       08:00       22:00
## 3345 Abarrotes       08:00       22:00
## 3346 Abarrotes       08:00       22:00
## 3347 Abarrotes       08:00       22:00
## 3348 Abarrotes       08:00       22:00
## 3349 Abarrotes       08:00       22:00
## 3350 Abarrotes       08:00       22:00
## 3351 Abarrotes       08:00       22:00
## 3352 Abarrotes       08:00       22:00
## 3353 Abarrotes       08:00       22:00
## 3354 Abarrotes       08:00       22:00
## 3355 Abarrotes       08:00       22:00
## 3356 Abarrotes       08:00       22:00
## 3357 Abarrotes       08:00       22:00
## 3358 Abarrotes       08:00       22:00
## 3359 Abarrotes       08:00       22:00
## 3360 Abarrotes       08:00       22:00
## 3361 Abarrotes       08:00       22:00
## 3362 Abarrotes       08:00       22:00
## 3363 Abarrotes       08:00       22:00
## 3364 Abarrotes       08:00       22:00
## 3365 Abarrotes       08:00       22:00
## 3366 Abarrotes       08:00       22:00
## 3367 Abarrotes       08:00       22:00
## 3368 Abarrotes       08:00       22:00
## 3369 Abarrotes       08:00       22:00
## 3370 Abarrotes       08:00       22:00
## 3371 Abarrotes       08:00       22:00
## 3372 Abarrotes       08:00       22:00
## 3373 Abarrotes       08:00       22:00
## 3374 Abarrotes       08:00       22:00
## 3375 Abarrotes       08:00       22:00
## 3376 Abarrotes       08:00       22:00
## 3377 Abarrotes       08:00       22:00
## 3378 Abarrotes       08:00       22:00
## 3379 Abarrotes       08:00       22:00
## 3380 Abarrotes       08:00       22:00
## 3381 Abarrotes       08:00       22:00
## 3382 Abarrotes       08:00       22:00
## 3383 Abarrotes       08:00       22:00
## 3384 Abarrotes       08:00       22:00
## 3385 Abarrotes       08:00       22:00
## 3386 Abarrotes       08:00       22:00
## 3387 Abarrotes       08:00       22:00
## 3388 Abarrotes       08:00       22:00
## 3389 Abarrotes       08:00       22:00
## 3390 Abarrotes       08:00       22:00
## 3391 Abarrotes       08:00       22:00
## 3392 Abarrotes       08:00       22:00
## 3393 Abarrotes       08:00       22:00
## 3394 Abarrotes       08:00       22:00
## 3395 Abarrotes       08:00       22:00
## 3396 Abarrotes       08:00       22:00
## 3397 Abarrotes       08:00       22:00
## 3398 Abarrotes       08:00       22:00
## 3399 Abarrotes       08:00       22:00
## 3400 Abarrotes       08:00       22:00
## 3401 Abarrotes       08:00       22:00
## 3402 Abarrotes       08:00       22:00
## 3403 Abarrotes       08:00       22:00
## 3404 Abarrotes       08:00       22:00
## 3405 Abarrotes       08:00       22:00
## 3406 Abarrotes       08:00       22:00
## 3407 Abarrotes       08:00       22:00
## 3408 Abarrotes       08:00       22:00
## 3409 Abarrotes       08:00       22:00
## 3410 Abarrotes       08:00       22:00
## 3411 Abarrotes       08:00       22:00
## 3412 Abarrotes       08:00       22:00
## 3413 Abarrotes       08:00       22:00
## 3414 Abarrotes       08:00       22:00
## 3415 Abarrotes       08:00       22:00
## 3416 Abarrotes       08:00       22:00
## 3417 Abarrotes       08:00       22:00
## 3418 Abarrotes       08:00       22:00
## 3419 Abarrotes       08:00       22:00
## 3420 Abarrotes       08:00       22:00
## 3421 Abarrotes       08:00       22:00
## 3422 Abarrotes       08:00       22:00
## 3423 Abarrotes       08:00       22:00
## 3424 Abarrotes       08:00       22:00
## 3425 Abarrotes       08:00       22:00
## 3426 Abarrotes       08:00       22:00
## 3427 Abarrotes       08:00       22:00
## 3428 Abarrotes       08:00       22:00
## 3429 Abarrotes       08:00       22:00
## 3430 Abarrotes       08:00       22:00
## 3431 Abarrotes       08:00       22:00
## 3432 Abarrotes       08:00       22:00
## 3433 Abarrotes       08:00       22:00
## 3434 Abarrotes       08:00       22:00
## 3435 Abarrotes       08:00       22:00
## 3436 Abarrotes       08:00       22:00
## 3437 Abarrotes       08:00       22:00
## 3438 Abarrotes       08:00       22:00
## 3439 Abarrotes       08:00       22:00
## 3440 Abarrotes       08:00       22:00
## 3441 Abarrotes       08:00       22:00
## 3442 Abarrotes       08:00       22:00
## 3443 Abarrotes       08:00       22:00
## 3444 Abarrotes       08:00       22:00
## 3445 Abarrotes       08:00       22:00
## 3446 Abarrotes       08:00       22:00
## 3447 Abarrotes       08:00       22:00
## 3448 Abarrotes       08:00       22:00
## 3449 Abarrotes       08:00       22:00
## 3450 Abarrotes       08:00       22:00
## 3451 Abarrotes       08:00       22:00
## 3452 Abarrotes       08:00       22:00
## 3453 Abarrotes       08:00       22:00
## 3454 Abarrotes       08:00       22:00
## 3455 Abarrotes       08:00       22:00
## 3456 Abarrotes       08:00       22:00
## 3457 Abarrotes       08:00       22:00
## 3458 Abarrotes       08:00       22:00
## 3459 Abarrotes       08:00       22:00
## 3460 Abarrotes       08:00       22:00
## 3461 Abarrotes       08:00       22:00
## 3462 Abarrotes       08:00       22:00
## 3463 Abarrotes       08:00       22:00
## 3464 Abarrotes       08:00       22:00
## 3465 Abarrotes       08:00       22:00
## 3466 Abarrotes       08:00       22:00
## 3467 Abarrotes       08:00       22:00
## 3468 Abarrotes       08:00       22:00
## 3469 Abarrotes       08:00       22:00
## 3470 Abarrotes       08:00       22:00
## 3471 Abarrotes       08:00       22:00
## 3472 Abarrotes       08:00       22:00
## 3473 Abarrotes       08:00       22:00
## 3474 Abarrotes       08:00       22:00
## 3475 Abarrotes       08:00       22:00
## 3476 Abarrotes       08:00       22:00
## 3477 Abarrotes       08:00       22:00
## 3478 Abarrotes       08:00       22:00
## 3479 Abarrotes       08:00       22:00
## 3480 Abarrotes       08:00       22:00
## 3481 Abarrotes       08:00       22:00
## 3482 Abarrotes       08:00       22:00
## 3483 Abarrotes       08:00       22:00
## 3484 Abarrotes       08:00       22:00
## 3485 Abarrotes       08:00       22:00
## 3486 Abarrotes       08:00       22:00
## 3487 Abarrotes       08:00       22:00
## 3488 Abarrotes       08:00       22:00
## 3489 Abarrotes       08:00       22:00
## 3490 Abarrotes       08:00       22:00
## 3491 Abarrotes       08:00       22:00
## 3492 Abarrotes       08:00       22:00
## 3493 Abarrotes       08:00       22:00
## 3494 Abarrotes       08:00       22:00
## 3495 Abarrotes       08:00       22:00
## 3496 Abarrotes       08:00       22:00
## 3497 Abarrotes       08:00       22:00
## 3498 Abarrotes       08:00       22:00
## 3499 Abarrotes       08:00       22:00
## 3500 Abarrotes       08:00       22:00
## 3501 Abarrotes       08:00       22:00
## 3502 Abarrotes       08:00       22:00
## 3503 Abarrotes       08:00       22:00
## 3504 Abarrotes       08:00       22:00
## 3505 Abarrotes       08:00       22:00
## 3506 Abarrotes       08:00       22:00
## 3507 Abarrotes       08:00       22:00
## 3508 Abarrotes       08:00       22:00
## 3509 Abarrotes       08:00       22:00
## 3510 Abarrotes       08:00       22:00
## 3511 Abarrotes       08:00       22:00
## 3512 Abarrotes       08:00       22:00
## 3513 Abarrotes       08:00       22:00
## 3514 Abarrotes       08:00       22:00
## 3515 Abarrotes       08:00       22:00
## 3516 Abarrotes       08:00       22:00
## 3517 Abarrotes       08:00       22:00
## 3518 Abarrotes       08:00       22:00
## 3519 Abarrotes       08:00       22:00
## 3520 Abarrotes       08:00       22:00
## 3521 Abarrotes       08:00       22:00
## 3522 Abarrotes       08:00       22:00
## 3523 Abarrotes       08:00       22:00
## 3524 Abarrotes       08:00       22:00
## 3525 Abarrotes       08:00       22:00
## 3526 Abarrotes       08:00       22:00
## 3527 Abarrotes       08:00       22:00
## 3528 Abarrotes       08:00       22:00
## 3529 Abarrotes       08:00       22:00
## 3530 Abarrotes       08:00       22:00
## 3531 Abarrotes       08:00       22:00
## 3532 Abarrotes       08:00       22:00
## 3533 Abarrotes       08:00       22:00
## 3534 Abarrotes       08:00       22:00
## 3535 Abarrotes       08:00       22:00
## 3536 Abarrotes       08:00       22:00
## 3537 Abarrotes       08:00       22:00
## 3538 Abarrotes       08:00       22:00
## 3539 Abarrotes       08:00       22:00
## 3540 Abarrotes       08:00       22:00
## 3541 Abarrotes       08:00       22:00
## 3542 Abarrotes       08:00       22:00
## 3543 Abarrotes       08:00       22:00
## 3544 Abarrotes       08:00       22:00
## 3545 Abarrotes       08:00       22:00
## 3546 Abarrotes       08:00       22:00
## 3547 Abarrotes       08:00       22:00
## 3548 Abarrotes       08:00       22:00
## 3549 Abarrotes       08:00       22:00
## 3550 Abarrotes       08:00       22:00
## 3551 Abarrotes       08:00       22:00
## 3552 Abarrotes       08:00       22:00
## 3553 Abarrotes       08:00       22:00
## 3554 Abarrotes       08:00       22:00
## 3555 Abarrotes       08:00       22:00
## 3556 Abarrotes       08:00       22:00
## 3557 Abarrotes       08:00       22:00
## 3558 Abarrotes       08:00       22:00
## 3559 Abarrotes       08:00       22:00
## 3560 Abarrotes       08:00       22:00
## 3561 Abarrotes       08:00       22:00
## 3562 Abarrotes       08:00       22:00
## 3563 Abarrotes       08:00       22:00
## 3564 Abarrotes       08:00       22:00
## 3565 Abarrotes       08:00       22:00
## 3566 Abarrotes       08:00       22:00
## 3567 Abarrotes       08:00       22:00
## 3568 Abarrotes       08:00       22:00
## 3569 Abarrotes       08:00       22:00
## 3570 Abarrotes       08:00       22:00
## 3571 Abarrotes       08:00       22:00
## 3572 Abarrotes       08:00       22:00
## 3573 Abarrotes       08:00       22:00
## 3574 Abarrotes       08:00       22:00
## 3575 Abarrotes       08:00       22:00
## 3576 Abarrotes       08:00       22:00
## 3577 Abarrotes       08:00       22:00
## 3578 Abarrotes       08:00       22:00
## 3579 Abarrotes       08:00       22:00
## 3580 Abarrotes       08:00       22:00
## 3581 Abarrotes       08:00       22:00
## 3582 Abarrotes       08:00       22:00
## 3583 Abarrotes       08:00       22:00
## 3584 Abarrotes       08:00       22:00
## 3585 Abarrotes       08:00       22:00
## 3586 Abarrotes       08:00       22:00
## 3587 Abarrotes       08:00       22:00
## 3588 Abarrotes       08:00       22:00
## 3589 Abarrotes       08:00       22:00
## 3590 Abarrotes       08:00       22:00
## 3591 Abarrotes       08:00       22:00
## 3592 Abarrotes       08:00       22:00
## 3593 Abarrotes       08:00       22:00
## 3594 Abarrotes       08:00       22:00
## 3595 Abarrotes       08:00       22:00
## 3596 Abarrotes       08:00       22:00
## 3597 Abarrotes       08:00       22:00
## 3598 Abarrotes       08:00       22:00
## 3599 Abarrotes       08:00       22:00
## 3600 Abarrotes       08:00       22:00
## 3601 Abarrotes       08:00       22:00
## 3602 Abarrotes       08:00       22:00
## 3603 Abarrotes       08:00       22:00
## 3604 Abarrotes       08:00       22:00
## 3605 Abarrotes       08:00       22:00
## 3606 Abarrotes       08:00       22:00
## 3607 Abarrotes       08:00       22:00
## 3608 Abarrotes       08:00       22:00
## 3609 Abarrotes       08:00       22:00
## 3610 Abarrotes       08:00       22:00
## 3611 Abarrotes       08:00       22:00
## 3612 Abarrotes       08:00       22:00
## 3613 Abarrotes       08:00       22:00
## 3614 Abarrotes       08:00       22:00
## 3615 Abarrotes       08:00       22:00
## 3616 Abarrotes       08:00       22:00
## 3617 Abarrotes       08:00       22:00
## 3618 Abarrotes       08:00       22:00
## 3619 Abarrotes       08:00       22:00
## 3620 Abarrotes       08:00       22:00
## 3621 Abarrotes       08:00       22:00
## 3622 Abarrotes       08:00       22:00
## 3623 Abarrotes       08:00       22:00
## 3624 Abarrotes       08:00       22:00
## 3625 Abarrotes       08:00       22:00
## 3626 Abarrotes       08:00       22:00
## 3627 Abarrotes       08:00       22:00
## 3628 Abarrotes       08:00       22:00
## 3629 Abarrotes       08:00       22:00
## 3630 Abarrotes       08:00       22:00
## 3631 Abarrotes       08:00       22:00
## 3632 Abarrotes       08:00       22:00
## 3633 Abarrotes       08:00       22:00
## 3634 Abarrotes       08:00       22:00
## 3635 Abarrotes       08:00       22:00
## 3636 Abarrotes       08:00       22:00
## 3637 Abarrotes       08:00       22:00
## 3638 Abarrotes       08:00       22:00
## 3639 Abarrotes       08:00       22:00
## 3640 Abarrotes       08:00       22:00
## 3641 Abarrotes       08:00       22:00
## 3642 Abarrotes       08:00       22:00
## 3643 Abarrotes       08:00       22:00
## 3644 Abarrotes       08:00       22:00
## 3645 Abarrotes       08:00       22:00
## 3646 Abarrotes       08:00       22:00
## 3647 Abarrotes       08:00       22:00
## 3648 Abarrotes       08:00       22:00
## 3649 Abarrotes       08:00       22:00
## 3650 Abarrotes       08:00       22:00
## 3651 Abarrotes       08:00       22:00
## 3652 Abarrotes       08:00       22:00
## 3653 Abarrotes       08:00       22:00
## 3654 Abarrotes       08:00       22:00
## 3655 Abarrotes       08:00       22:00
## 3656 Abarrotes       08:00       22:00
## 3657 Abarrotes       08:00       22:00
## 3658 Abarrotes       08:00       22:00
## 3659 Abarrotes       08:00       22:00
## 3660 Abarrotes       08:00       22:00
## 3661 Abarrotes       08:00       22:00
## 3662 Abarrotes       08:00       22:00
## 3663 Abarrotes       08:00       22:00
## 3664 Abarrotes       08:00       22:00
## 3665 Abarrotes       08:00       22:00
## 3666 Abarrotes       08:00       22:00
## 3667 Abarrotes       08:00       22:00
## 3668 Abarrotes       08:00       22:00
## 3669 Abarrotes       08:00       22:00
## 3670 Abarrotes       08:00       22:00
## 3671 Abarrotes       08:00       22:00
## 3672 Abarrotes       08:00       22:00
## 3673 Abarrotes       08:00       22:00
## 3674 Abarrotes       08:00       22:00
## 3675 Abarrotes       08:00       22:00
## 3676 Abarrotes       08:00       22:00
## 3677 Abarrotes       08:00       22:00
## 3678 Abarrotes       08:00       22:00
## 3679 Abarrotes       08:00       22:00
## 3680 Abarrotes       08:00       22:00
## 3681 Abarrotes       08:00       22:00
## 3682 Abarrotes       08:00       22:00
## 3683 Abarrotes       08:00       22:00
## 3684 Abarrotes       08:00       22:00
## 3685 Abarrotes       08:00       22:00
## 3686 Abarrotes       08:00       22:00
## 3687 Abarrotes       08:00       22:00
## 3688 Abarrotes       08:00       22:00
## 3689 Abarrotes       08:00       22:00
## 3690 Abarrotes       08:00       22:00
## 3691 Abarrotes       08:00       22:00
## 3692 Abarrotes       08:00       22:00
## 3693 Abarrotes       08:00       22:00
## 3694 Abarrotes       08:00       22:00
## 3695 Abarrotes       08:00       22:00
## 3696 Abarrotes       08:00       22:00
## 3697 Abarrotes       08:00       22:00
## 3698 Abarrotes       08:00       22:00
## 3699 Abarrotes       08:00       22:00
## 3700 Abarrotes       08:00       22:00
## 3701 Abarrotes       08:00       22:00
## 3702 Abarrotes       08:00       22:00
## 3703 Abarrotes       08:00       22:00
## 3704 Abarrotes       08:00       22:00
## 3705 Abarrotes       08:00       22:00
## 3706 Abarrotes       08:00       22:00
## 3707 Abarrotes       08:00       22:00
## 3708 Abarrotes       08:00       22:00
## 3709 Abarrotes       08:00       22:00
## 3710 Abarrotes       08:00       22:00
## 3711 Abarrotes       08:00       22:00
## 3712 Abarrotes       08:00       22:00
## 3713 Abarrotes       08:00       22:00
## 3714 Abarrotes       08:00       22:00
## 3715 Abarrotes       08:00       22:00
## 3716 Abarrotes       08:00       22:00
## 3717 Abarrotes       08:00       22:00
## 3718 Abarrotes       08:00       22:00
## 3719 Abarrotes       08:00       22:00
## 3720 Abarrotes       08:00       22:00
## 3721 Abarrotes       08:00       22:00
## 3722 Abarrotes       08:00       22:00
## 3723 Abarrotes       08:00       22:00
## 3724 Abarrotes       08:00       22:00
## 3725 Abarrotes       08:00       22:00
## 3726 Abarrotes       08:00       22:00
## 3727 Abarrotes       08:00       22:00
## 3728 Abarrotes       08:00       22:00
## 3729 Abarrotes       08:00       22:00
## 3730 Abarrotes       08:00       22:00
## 3731 Abarrotes       08:00       22:00
## 3732 Abarrotes       08:00       22:00
## 3733 Abarrotes       08:00       22:00
## 3734 Abarrotes       08:00       22:00
## 3735 Abarrotes       08:00       22:00
## 3736 Abarrotes       08:00       22:00
## 3737 Abarrotes       08:00       22:00
## 3738 Abarrotes       08:00       22:00
## 3739 Abarrotes       08:00       22:00
## 3740 Abarrotes       08:00       22:00
## 3741 Abarrotes       08:00       22:00
## 3742 Abarrotes       08:00       22:00
## 3743 Abarrotes       08:00       22:00
## 3744 Abarrotes       08:00       22:00
## 3745 Abarrotes       08:00       22:00
## 3746 Abarrotes       08:00       22:00
## 3747 Abarrotes       08:00       22:00
## 3748 Abarrotes       08:00       22:00
## 3749 Abarrotes       08:00       22:00
## 3750 Abarrotes       08:00       22:00
## 3751 Abarrotes       08:00       22:00
## 3752 Abarrotes       08:00       22:00
## 3753 Abarrotes       08:00       22:00
## 3754 Abarrotes       08:00       22:00
## 3755 Abarrotes       08:00       22:00
## 3756 Abarrotes       08:00       22:00
## 3757 Abarrotes       08:00       22:00
## 3758 Abarrotes       08:00       22:00
## 3759 Abarrotes       08:00       22:00
## 3760 Abarrotes       08:00       22:00
## 3761 Abarrotes       08:00       22:00
## 3762 Abarrotes       08:00       22:00
## 3763 Abarrotes       08:00       22:00
## 3764 Abarrotes       08:00       22:00
## 3765 Abarrotes       08:00       22:00
## 3766 Abarrotes       08:00       22:00
## 3767 Abarrotes       08:00       22:00
## 3768 Abarrotes       08:00       22:00
## 3769 Abarrotes       08:00       22:00
## 3770 Abarrotes       08:00       22:00
## 3771 Abarrotes       08:00       22:00
## 3772 Abarrotes       08:00       22:00
## 3773 Abarrotes       08:00       22:00
## 3774 Abarrotes       08:00       22:00
## 3775 Abarrotes       08:00       22:00
## 3776 Abarrotes       08:00       22:00
## 3777 Abarrotes       08:00       22:00
## 3778 Abarrotes       08:00       22:00
## 3779 Abarrotes       08:00       22:00
## 3780 Abarrotes       08:00       22:00
## 3781 Abarrotes       08:00       22:00
## 3782 Abarrotes       08:00       22:00
## 3783 Abarrotes       08:00       22:00
## 3784 Abarrotes       08:00       22:00
## 3785 Abarrotes       08:00       22:00
## 3786 Abarrotes       08:00       22:00
## 3787 Abarrotes       08:00       22:00
## 3788 Abarrotes       08:00       22:00
## 3789 Abarrotes       08:00       22:00
## 3790 Abarrotes       08:00       22:00
## 3791 Abarrotes       08:00       22:00
## 3792 Abarrotes       08:00       22:00
## 3793 Abarrotes       08:00       22:00
## 3794 Abarrotes       08:00       22:00
## 3795 Abarrotes       08:00       22:00
## 3796 Abarrotes       08:00       22:00
## 3797 Abarrotes       08:00       22:00
## 3798 Abarrotes       08:00       22:00
## 3799 Abarrotes       08:00       22:00
## 3800 Abarrotes       08:00       22:00
## 3801 Abarrotes       08:00       22:00
## 3802 Abarrotes       08:00       22:00
## 3803 Abarrotes       08:00       22:00
## 3804 Abarrotes       08:00       22:00
## 3805 Abarrotes       08:00       22:00
## 3806 Abarrotes       08:00       22:00
## 3807 Abarrotes       08:00       22:00
## 3808 Abarrotes       08:00       22:00
## 3809 Abarrotes       08:00       22:00
## 3810 Abarrotes       08:00       22:00
## 3811 Abarrotes       08:00       22:00
## 3812 Abarrotes       08:00       22:00
## 3813 Abarrotes       08:00       22:00
## 3814 Abarrotes       08:00       22:00
## 3815 Abarrotes       08:00       22:00
## 3816 Abarrotes       08:00       22:00
## 3817 Abarrotes       08:00       22:00
## 3818 Abarrotes       08:00       22:00
## 3819 Abarrotes       08:00       22:00
## 3820 Abarrotes       08:00       22:00
## 3821 Abarrotes       08:00       22:00
## 3822 Abarrotes       08:00       22:00
## 3823 Abarrotes       08:00       22:00
## 3824 Abarrotes       08:00       22:00
## 3825 Abarrotes       08:00       22:00
## 3826 Abarrotes       08:00       22:00
## 3827 Abarrotes       08:00       22:00
## 3828 Abarrotes       08:00       22:00
## 3829 Abarrotes       08:00       22:00
## 3830 Abarrotes       08:00       22:00
## 3831 Abarrotes       08:00       22:00
## 3832 Abarrotes       08:00       22:00
## 3833 Abarrotes       08:00       22:00
## 3834 Abarrotes       08:00       22:00
## 3835 Abarrotes       08:00       22:00
## 3836 Abarrotes       08:00       22:00
## 3837 Abarrotes       08:00       22:00
## 3838 Abarrotes       08:00       22:00
## 3839 Abarrotes       08:00       22:00
## 3840 Abarrotes       08:00       22:00
## 3841 Abarrotes       08:00       22:00
## 3842 Abarrotes       08:00       22:00
## 3843 Abarrotes       08:00       22:00
## 3844 Abarrotes       08:00       22:00
## 3845 Abarrotes       08:00       22:00
## 3846 Abarrotes       08:00       22:00
## 3847 Abarrotes       08:00       22:00
## 3848 Abarrotes       08:00       22:00
## 3849 Abarrotes       08:00       22:00
## 3850 Abarrotes       08:00       22:00
## 3851 Abarrotes       08:00       22:00
## 3852 Abarrotes       08:00       22:00
## 3853 Abarrotes       08:00       22:00
## 3854 Abarrotes       08:00       22:00
## 3855 Abarrotes       08:00       22:00
## 3856 Abarrotes       08:00       22:00
## 3857 Abarrotes       08:00       22:00
## 3858 Abarrotes       08:00       22:00
## 3859 Abarrotes       08:00       22:00
## 3860 Abarrotes       08:00       22:00
## 3861 Abarrotes       08:00       22:00
## 3862 Abarrotes       08:00       22:00
## 3863 Abarrotes       08:00       22:00
## 3864 Abarrotes       08:00       22:00
## 3865 Abarrotes       08:00       22:00
## 3866 Abarrotes       08:00       22:00
## 3867 Abarrotes       08:00       22:00
## 3868 Abarrotes       08:00       22:00
## 3869 Abarrotes       08:00       22:00
## 3870 Abarrotes       08:00       22:00
## 3871 Abarrotes       08:00       22:00
## 3872 Abarrotes       08:00       22:00
## 3873 Abarrotes       08:00       22:00
## 3874 Abarrotes       08:00       22:00
## 3875 Abarrotes       08:00       22:00
## 3876 Abarrotes       08:00       22:00
## 3877 Abarrotes       08:00       22:00
## 3878 Abarrotes       08:00       22:00
## 3879 Abarrotes       08:00       22:00
## 3880 Abarrotes       08:00       22:00
## 3881 Abarrotes       08:00       22:00
## 3882 Abarrotes       08:00       22:00
## 3883 Abarrotes       08:00       22:00
## 3884 Abarrotes       08:00       22:00
## 3885 Abarrotes       08:00       22:00
## 3886 Abarrotes       08:00       22:00
## 3887 Abarrotes       08:00       22:00
## 3888 Abarrotes       08:00       22:00
## 3889 Abarrotes       08:00       22:00
## 3890 Abarrotes       08:00       22:00
## 3891 Abarrotes       08:00       22:00
## 3892 Abarrotes       08:00       22:00
## 3893 Abarrotes       08:00       22:00
## 3894 Abarrotes       08:00       22:00
## 3895 Abarrotes       08:00       22:00
## 3896 Abarrotes       08:00       22:00
## 3897 Abarrotes       08:00       22:00
## 3898 Abarrotes       08:00       22:00
## 3899 Abarrotes       08:00       22:00
## 3900 Abarrotes       08:00       22:00
## 3901 Abarrotes       08:00       22:00
## 3902 Abarrotes       08:00       22:00
## 3903 Abarrotes       08:00       22:00
## 3904 Abarrotes       08:00       22:00
## 3905 Abarrotes       08:00       22:00
## 3906 Abarrotes       08:00       22:00
## 3907 Abarrotes       08:00       22:00
## 3908 Abarrotes       08:00       22:00
## 3909 Abarrotes       08:00       22:00
## 3910 Abarrotes       08:00       22:00
## 3911 Abarrotes       08:00       22:00
## 3912 Abarrotes       08:00       22:00
## 3913 Abarrotes       08:00       22:00
## 3914 Abarrotes       08:00       22:00
## 3915 Abarrotes       08:00       22:00
## 3916 Abarrotes       08:00       22:00
## 3917 Abarrotes       08:00       22:00
## 3918 Abarrotes       08:00       22:00
## 3919 Abarrotes       08:00       22:00
## 3920 Abarrotes       08:00       22:00
## 3921 Abarrotes       08:00       22:00
## 3922 Abarrotes       08:00       22:00
## 3923 Abarrotes       08:00       22:00
## 3924 Abarrotes       08:00       22:00
## 3925 Abarrotes       08:00       22:00
## 3926 Abarrotes       08:00       22:00
## 3927 Abarrotes       08:00       22:00
## 3928 Abarrotes       08:00       22:00
## 3929 Abarrotes       08:00       22:00
## 3930 Abarrotes       08:00       22:00
## 3931 Abarrotes       08:00       22:00
## 3932 Abarrotes       08:00       22:00
## 3933 Abarrotes       08:00       22:00
## 3934 Abarrotes       08:00       22:00
## 3935 Abarrotes       08:00       22:00
## 3936 Abarrotes       08:00       22:00
## 3937 Abarrotes       08:00       22:00
## 3938 Abarrotes       08:00       22:00
## 3939 Abarrotes       08:00       22:00
## 3940 Abarrotes       08:00       22:00
## 3941 Abarrotes       08:00       22:00
## 3942 Abarrotes       08:00       22:00
## 3943 Abarrotes       08:00       22:00
## 3944 Abarrotes       08:00       22:00
## 3945 Abarrotes       08:00       22:00
## 3946 Abarrotes       08:00       22:00
## 3947 Abarrotes       08:00       22:00
## 3948 Abarrotes       08:00       22:00
## 3949 Abarrotes       08:00       22:00
## 3950 Abarrotes       08:00       22:00
## 3951 Abarrotes       08:00       22:00
## 3952 Abarrotes       08:00       22:00
## 3953 Abarrotes       08:00       22:00
## 3954 Abarrotes       08:00       22:00
## 3955 Abarrotes       08:00       22:00
## 3956 Abarrotes       08:00       22:00
## 3957 Abarrotes       08:00       22:00
## 3958 Abarrotes       08:00       22:00
## 3959 Abarrotes       08:00       22:00
## 3960 Abarrotes       08:00       22:00
## 3961 Abarrotes       08:00       22:00
## 3962 Abarrotes       08:00       22:00
## 3963 Abarrotes       08:00       22:00
## 3964 Abarrotes       08:00       22:00
## 3965 Abarrotes       08:00       22:00
## 3966 Abarrotes       08:00       22:00
## 3967 Abarrotes       08:00       22:00
## 3968 Abarrotes       08:00       22:00
## 3969 Abarrotes       08:00       22:00
## 3970 Abarrotes       08:00       22:00
## 3971 Abarrotes       08:00       22:00
## 3972 Abarrotes       08:00       22:00
## 3973 Abarrotes       08:00       22:00
## 3974 Abarrotes       08:00       22:00
## 3975 Abarrotes       08:00       22:00
## 3976 Abarrotes       08:00       22:00
## 3977 Abarrotes       08:00       22:00
## 3978 Abarrotes       08:00       22:00
## 3979 Abarrotes       08:00       22:00
## 3980 Abarrotes       08:00       22:00
## 3981 Abarrotes       08:00       22:00
## 3982 Abarrotes       08:00       22:00
## 3983 Abarrotes       08:00       22:00
## 3984 Abarrotes       08:00       22:00
## 3985 Abarrotes       08:00       22:00
## 3986 Abarrotes       08:00       22:00
## 3987 Abarrotes       08:00       22:00
## 3988 Abarrotes       08:00       22:00
## 3989 Abarrotes       08:00       22:00
## 3990 Abarrotes       08:00       22:00
## 3991 Abarrotes       08:00       22:00
## 3992 Abarrotes       08:00       22:00
## 3993 Abarrotes       08:00       22:00
## 3994 Abarrotes       08:00       22:00
## 3995 Abarrotes       08:00       22:00
## 3996 Abarrotes       08:00       22:00
## 3997 Abarrotes       08:00       22:00
## 3998 Abarrotes       08:00       22:00
## 3999 Abarrotes       08:00       22:00
## 4000 Abarrotes       08:00       22:00
## 4001 Abarrotes       08:00       22:00
## 4002 Abarrotes       08:00       22:00
## 4003 Abarrotes       08:00       22:00
## 4004 Abarrotes       08:00       22:00
## 4005 Abarrotes       08:00       22:00
## 4006 Abarrotes       08:00       22:00
## 4007 Abarrotes       08:00       22:00
## 4008 Abarrotes       08:00       22:00
## 4009 Abarrotes       08:00       22:00
## 4010 Abarrotes       08:00       22:00
## 4011 Abarrotes       08:00       22:00
## 4012 Abarrotes       08:00       22:00
## 4013 Abarrotes       08:00       22:00
## 4014 Abarrotes       08:00       22:00
## 4015 Abarrotes       08:00       22:00
## 4016 Abarrotes       08:00       22:00
## 4017 Abarrotes       08:00       22:00
## 4018 Abarrotes       08:00       22:00
## 4019 Abarrotes       08:00       22:00
## 4020 Abarrotes       08:00       22:00
## 4021 Abarrotes       08:00       22:00
## 4022 Abarrotes       08:00       22:00
## 4023 Abarrotes       08:00       22:00
## 4024 Abarrotes       08:00       22:00
## 4025 Abarrotes       08:00       22:00
## 4026 Abarrotes       08:00       22:00
## 4027 Abarrotes       08:00       22:00
## 4028 Abarrotes       08:00       22:00
## 4029 Abarrotes       08:00       22:00
## 4030 Abarrotes       08:00       22:00
## 4031 Abarrotes       08:00       22:00
## 4032 Abarrotes       08:00       22:00
## 4033 Abarrotes       08:00       22:00
## 4034 Abarrotes       08:00       22:00
## 4035 Abarrotes       08:00       22:00
## 4036 Abarrotes       08:00       22:00
## 4037 Abarrotes       08:00       22:00
## 4038 Abarrotes       08:00       22:00
## 4039 Abarrotes       08:00       22:00
## 4040 Abarrotes       08:00       22:00
## 4041 Abarrotes       08:00       22:00
## 4042 Abarrotes       08:00       22:00
## 4043 Abarrotes       08:00       22:00
## 4044 Abarrotes       08:00       22:00
## 4045 Abarrotes       08:00       22:00
## 4046 Abarrotes       08:00       22:00
## 4047 Abarrotes       08:00       22:00
## 4048 Abarrotes       08:00       22:00
## 4049 Abarrotes       08:00       22:00
## 4050 Abarrotes       08:00       22:00
## 4051 Abarrotes       08:00       22:00
## 4052 Abarrotes       08:00       22:00
## 4053 Abarrotes       08:00       22:00
## 4054 Abarrotes       08:00       22:00
## 4055 Abarrotes       08:00       22:00
## 4056 Abarrotes       08:00       22:00
## 4057 Abarrotes       08:00       22:00
## 4058 Abarrotes       08:00       22:00
## 4059 Abarrotes       08:00       22:00
## 4060 Abarrotes       08:00       22:00
## 4061 Abarrotes       08:00       22:00
## 4062 Abarrotes       08:00       22:00
## 4063 Abarrotes       08:00       22:00
## 4064 Abarrotes       08:00       22:00
## 4065 Abarrotes       08:00       22:00
## 4066 Abarrotes       08:00       22:00
## 4067 Abarrotes       08:00       22:00
## 4068 Abarrotes       08:00       22:00
## 4069 Abarrotes       08:00       22:00
## 4070 Abarrotes       08:00       22:00
## 4071 Abarrotes       08:00       22:00
## 4072 Abarrotes       08:00       22:00
## 4073 Abarrotes       08:00       22:00
## 4074 Abarrotes       08:00       22:00
## 4075 Abarrotes       08:00       22:00
## 4076 Abarrotes       08:00       22:00
## 4077 Abarrotes       08:00       22:00
## 4078 Abarrotes       08:00       22:00
## 4079 Abarrotes       08:00       22:00
## 4080 Abarrotes       08:00       22:00
## 4081 Abarrotes       08:00       22:00
## 4082 Abarrotes       08:00       22:00
## 4083 Abarrotes       08:00       22:00
## 4084 Abarrotes       08:00       22:00
## 4085 Abarrotes       08:00       22:00
## 4086 Abarrotes       08:00       22:00
## 4087 Abarrotes       08:00       22:00
## 4088 Abarrotes       08:00       22:00
## 4089 Abarrotes       08:00       22:00
## 4090 Abarrotes       08:00       22:00
## 4091 Abarrotes       08:00       22:00
## 4092 Abarrotes       08:00       22:00
## 4093 Abarrotes       08:00       22:00
## 4094 Abarrotes       08:00       22:00
## 4095 Abarrotes       08:00       22:00
## 4096 Abarrotes       08:00       22:00
## 4097 Abarrotes       08:00       22:00
## 4098 Abarrotes       08:00       22:00
## 4099 Abarrotes       08:00       22:00
## 4100 Abarrotes       08:00       22:00
## 4101 Abarrotes       08:00       22:00
## 4102 Abarrotes       08:00       22:00
## 4103 Abarrotes       08:00       22:00
## 4104 Abarrotes       08:00       22:00
## 4105 Abarrotes       08:00       22:00
## 4106 Abarrotes       08:00       22:00
## 4107 Abarrotes       08:00       22:00
## 4108 Abarrotes       08:00       22:00
## 4109 Abarrotes       08:00       22:00
## 4110 Abarrotes       08:00       22:00
## 4111 Abarrotes       08:00       22:00
## 4112 Abarrotes       08:00       22:00
## 4113 Abarrotes       08:00       22:00
## 4114 Abarrotes       08:00       22:00
## 4115 Abarrotes       08:00       22:00
## 4116 Abarrotes       08:00       22:00
## 4117 Abarrotes       08:00       22:00
## 4118 Abarrotes       08:00       22:00
## 4119 Abarrotes       08:00       22:00
## 4120 Abarrotes       08:00       22:00
## 4121 Abarrotes       08:00       22:00
## 4122 Abarrotes       08:00       22:00
## 4123 Abarrotes       08:00       22:00
## 4124 Abarrotes       08:00       22:00
## 4125 Abarrotes       08:00       22:00
## 4126 Abarrotes       08:00       22:00
## 4127 Abarrotes       08:00       22:00
## 4128 Abarrotes       08:00       22:00
## 4129 Abarrotes       08:00       22:00
## 4130 Abarrotes       08:00       22:00
## 4131 Abarrotes       08:00       22:00
## 4132 Abarrotes       08:00       22:00
## 4133 Abarrotes       08:00       22:00
## 4134 Abarrotes       08:00       22:00
## 4135 Abarrotes       08:00       22:00
## 4136 Abarrotes       08:00       22:00
## 4137 Abarrotes       08:00       22:00
## 4138 Abarrotes       08:00       22:00
## 4139 Abarrotes       08:00       22:00
## 4140 Abarrotes       08:00       22:00
## 4141 Abarrotes       08:00       22:00
## 4142 Abarrotes       08:00       22:00
## 4143 Abarrotes       08:00       22:00
## 4144 Abarrotes       08:00       22:00
## 4145 Abarrotes       08:00       22:00
## 4146 Abarrotes       08:00       22:00
## 4147 Abarrotes       08:00       22:00
## 4148 Abarrotes       08:00       22:00
## 4149 Abarrotes       08:00       22:00
## 4150 Abarrotes       08:00       22:00
## 4151 Abarrotes       08:00       22:00
## 4152 Abarrotes       08:00       22:00
## 4153 Abarrotes       08:00       22:00
## 4154 Abarrotes       08:00       22:00
## 4155 Abarrotes       08:00       22:00
## 4156 Abarrotes       08:00       22:00
## 4157 Abarrotes       08:00       22:00
## 4158 Abarrotes       08:00       22:00
## 4159 Abarrotes       08:00       22:00
## 4160 Abarrotes       08:00       22:00
## 4161 Abarrotes       08:00       22:00
## 4162 Abarrotes       08:00       22:00
## 4163 Abarrotes       08:00       22:00
## 4164 Abarrotes       08:00       22:00
## 4165 Abarrotes       08:00       22:00
## 4166 Abarrotes       08:00       22:00
## 4167 Abarrotes       08:00       22:00
## 4168 Abarrotes       08:00       22:00
## 4169 Abarrotes       08:00       22:00
## 4170 Abarrotes       08:00       22:00
## 4171 Abarrotes       08:00       22:00
## 4172 Abarrotes       08:00       22:00
## 4173 Abarrotes       08:00       22:00
## 4174 Abarrotes       08:00       22:00
## 4175 Abarrotes       08:00       22:00
## 4176 Abarrotes       08:00       22:00
## 4177 Abarrotes       08:00       22:00
## 4178 Abarrotes       08:00       22:00
## 4179 Abarrotes       08:00       22:00
## 4180 Abarrotes       08:00       22:00
## 4181 Abarrotes       08:00       22:00
## 4182 Abarrotes       08:00       22:00
## 4183 Abarrotes       08:00       22:00
## 4184 Abarrotes       08:00       22:00
## 4185 Abarrotes       08:00       22:00
## 4186 Abarrotes       08:00       22:00
## 4187 Abarrotes       08:00       22:00
## 4188 Abarrotes       08:00       22:00
## 4189 Abarrotes       08:00       22:00
## 4190 Abarrotes       08:00       22:00
## 4191 Abarrotes       08:00       22:00
## 4192 Abarrotes       08:00       22:00
## 4193 Abarrotes       08:00       22:00
## 4194 Abarrotes       08:00       22:00
## 4195 Abarrotes       08:00       22:00
## 4196 Abarrotes       08:00       22:00
## 4197 Abarrotes       08:00       22:00
## 4198 Abarrotes       08:00       22:00
## 4199 Abarrotes       08:00       22:00
## 4200 Abarrotes       08:00       22:00
## 4201 Abarrotes       08:00       22:00
## 4202 Abarrotes       08:00       22:00
## 4203 Abarrotes       08:00       22:00
## 4204 Abarrotes       08:00       22:00
## 4205 Abarrotes       08:00       22:00
## 4206 Abarrotes       08:00       22:00
## 4207 Abarrotes       08:00       22:00
## 4208 Abarrotes       08:00       22:00
## 4209 Abarrotes       08:00       22:00
## 4210 Abarrotes       08:00       22:00
## 4211 Abarrotes       08:00       22:00
## 4212 Abarrotes       08:00       22:00
## 4213 Abarrotes       08:00       22:00
## 4214 Abarrotes       08:00       22:00
## 4215 Abarrotes       08:00       22:00
## 4216 Abarrotes       08:00       22:00
## 4217 Abarrotes       08:00       22:00
## 4218 Abarrotes       08:00       22:00
## 4219 Abarrotes       08:00       22:00
## 4220 Abarrotes       08:00       22:00
## 4221 Abarrotes       08:00       22:00
## 4222 Abarrotes       08:00       22:00
## 4223 Abarrotes       08:00       22:00
## 4224 Abarrotes       08:00       22:00
## 4225 Abarrotes       08:00       22:00
## 4226 Abarrotes       08:00       22:00
## 4227 Abarrotes       08:00       22:00
## 4228 Abarrotes       08:00       22:00
## 4229 Abarrotes       08:00       22:00
## 4230 Abarrotes       08:00       22:00
## 4231 Abarrotes       08:00       22:00
## 4232 Abarrotes       08:00       22:00
## 4233 Abarrotes       08:00       22:00
## 4234 Abarrotes       08:00       22:00
## 4235 Abarrotes       08:00       22:00
## 4236 Abarrotes       08:00       22:00
## 4237 Abarrotes       08:00       22:00
## 4238 Abarrotes       08:00       22:00
## 4239 Abarrotes       08:00       22:00
## 4240 Abarrotes       08:00       22:00
## 4241 Abarrotes       08:00       22:00
## 4242 Abarrotes       08:00       22:00
## 4243 Abarrotes       08:00       22:00
## 4244 Abarrotes       08:00       22:00
## 4245 Abarrotes       08:00       22:00
## 4246 Abarrotes       08:00       22:00
## 4247 Abarrotes       08:00       22:00
## 4248 Abarrotes       08:00       22:00
## 4249 Abarrotes       08:00       22:00
## 4250 Abarrotes       08:00       22:00
## 4251 Abarrotes       08:00       22:00
## 4252 Abarrotes       08:00       22:00
## 4253 Abarrotes       08:00       22:00
## 4254 Abarrotes       08:00       22:00
## 4255 Abarrotes       08:00       22:00
## 4256 Abarrotes       08:00       22:00
## 4257 Abarrotes       08:00       22:00
## 4258 Abarrotes       08:00       22:00
## 4259 Abarrotes       08:00       22:00
## 4260 Abarrotes       08:00       22:00
## 4261 Abarrotes       08:00       22:00
## 4262 Abarrotes       08:00       22:00
## 4263 Abarrotes       08:00       22:00
## 4264 Abarrotes       08:00       22:00
## 4265 Abarrotes       08:00       22:00
## 4266 Abarrotes       08:00       22:00
## 4267 Abarrotes       08:00       22:00
## 4268 Abarrotes       08:00       22:00
## 4269 Abarrotes       08:00       22:00
## 4270 Abarrotes       08:00       22:00
## 4271 Abarrotes       08:00       22:00
## 4272 Abarrotes       08:00       22:00
## 4273 Abarrotes       08:00       22:00
## 4274 Abarrotes       08:00       22:00
## 4275 Abarrotes       08:00       22:00
## 4276 Abarrotes       08:00       22:00
## 4277 Abarrotes       08:00       22:00
## 4278 Abarrotes       08:00       22:00
## 4279 Abarrotes       08:00       22:00
## 4280 Abarrotes       08:00       22:00
## 4281 Abarrotes       08:00       22:00
## 4282 Abarrotes       08:00       22:00
## 4283 Abarrotes       08:00       22:00
## 4284 Abarrotes       08:00       22:00
## 4285 Abarrotes       08:00       22:00
## 4286 Abarrotes       08:00       22:00
## 4287 Abarrotes       08:00       22:00
## 4288 Abarrotes       08:00       22:00
## 4289 Abarrotes       08:00       22:00
## 4290 Abarrotes       08:00       22:00
## 4291 Abarrotes       08:00       22:00
## 4292 Abarrotes       08:00       22:00
## 4293 Abarrotes       08:00       22:00
## 4294 Abarrotes       08:00       22:00
## 4295 Abarrotes       08:00       22:00
## 4296 Abarrotes       08:00       22:00
## 4297 Abarrotes       08:00       22:00
## 4298 Abarrotes       08:00       22:00
## 4299 Abarrotes       08:00       22:00
## 4300 Abarrotes       08:00       22:00
## 4301 Abarrotes       08:00       22:00
## 4302 Abarrotes       08:00       22:00
## 4303 Abarrotes       08:00       22:00
## 4304 Abarrotes       08:00       22:00
## 4305 Abarrotes       08:00       22:00
## 4306 Abarrotes       08:00       22:00
## 4307 Abarrotes       08:00       22:00
## 4308 Abarrotes       08:00       22:00
## 4309 Abarrotes       08:00       22:00
## 4310 Abarrotes       08:00       22:00
## 4311 Abarrotes       08:00       22:00
## 4312 Abarrotes       08:00       22:00
## 4313 Abarrotes       08:00       22:00
## 4314 Abarrotes       08:00       22:00
## 4315 Abarrotes       08:00       22:00
## 4316 Abarrotes       08:00       22:00
## 4317 Abarrotes       08:00       22:00
## 4318 Abarrotes       08:00       22:00
## 4319 Abarrotes       08:00       22:00
## 4320 Abarrotes       08:00       22:00
## 4321 Abarrotes       08:00       22:00
## 4322 Abarrotes       08:00       22:00
## 4323 Abarrotes       08:00       22:00
## 4324 Abarrotes       08:00       22:00
## 4325 Abarrotes       08:00       22:00
## 4326 Abarrotes       08:00       22:00
## 4327 Abarrotes       08:00       22:00
## 4328 Abarrotes       08:00       22:00
## 4329 Abarrotes       08:00       22:00
## 4330 Abarrotes       08:00       22:00
## 4331 Abarrotes       08:00       22:00
## 4332 Abarrotes       08:00       22:00
## 4333 Abarrotes       08:00       22:00
## 4334 Abarrotes       08:00       22:00
## 4335 Abarrotes       08:00       22:00
## 4336 Abarrotes       08:00       22:00
## 4337 Abarrotes       08:00       22:00
## 4338 Abarrotes       08:00       22:00
## 4339 Abarrotes       08:00       22:00
## 4340 Abarrotes       08:00       22:00
## 4341 Abarrotes       08:00       22:00
## 4342 Abarrotes       08:00       22:00
## 4343 Abarrotes       08:00       22:00
## 4344 Abarrotes       08:00       22:00
## 4345 Abarrotes       08:00       22:00
## 4346 Abarrotes       08:00       22:00
## 4347 Abarrotes       08:00       22:00
## 4348 Abarrotes       08:00       22:00
## 4349 Abarrotes       08:00       22:00
## 4350 Abarrotes       08:00       22:00
## 4351 Abarrotes       08:00       22:00
## 4352 Abarrotes       08:00       22:00
## 4353 Abarrotes       08:00       22:00
## 4354 Abarrotes       08:00       22:00
## 4355 Abarrotes       08:00       22:00
## 4356 Abarrotes       08:00       22:00
## 4357 Abarrotes       08:00       22:00
## 4358 Abarrotes       08:00       22:00
## 4359 Abarrotes       08:00       22:00
## 4360 Abarrotes       08:00       22:00
## 4361 Abarrotes       08:00       22:00
## 4362 Abarrotes       08:00       22:00
## 4363 Abarrotes       08:00       22:00
## 4364 Abarrotes       08:00       22:00
## 4365 Abarrotes       08:00       22:00
## 4366 Abarrotes       08:00       22:00
## 4367 Abarrotes       08:00       22:00
## 4368 Abarrotes       08:00       22:00
## 4369 Abarrotes       08:00       22:00
## 4370 Abarrotes       08:00       22:00
## 4371 Abarrotes       08:00       22:00
## 4372 Abarrotes       08:00       22:00
## 4373 Abarrotes       08:00       22:00
## 4374 Abarrotes       08:00       22:00
## 4375 Abarrotes       08:00       22:00
## 4376 Abarrotes       08:00       22:00
## 4377 Abarrotes       08:00       22:00
## 4378 Abarrotes       08:00       22:00
## 4379 Abarrotes       08:00       22:00
## 4380 Abarrotes       08:00       22:00
## 4381 Abarrotes       08:00       22:00
## 4382 Abarrotes       08:00       22:00
## 4383 Abarrotes       08:00       22:00
## 4384 Abarrotes       08:00       22:00
## 4385 Abarrotes       08:00       22:00
## 4386 Abarrotes       08:00       22:00
## 4387 Abarrotes       08:00       22:00
## 4388 Abarrotes       08:00       22:00
## 4389 Abarrotes       08:00       22:00
## 4390 Abarrotes       08:00       22:00
## 4391 Abarrotes       08:00       22:00
## 4392 Abarrotes       08:00       22:00
## 4393 Abarrotes       08:00       22:00
## 4394 Abarrotes       08:00       22:00
## 4395 Abarrotes       08:00       22:00
## 4396 Abarrotes       08:00       22:00
## 4397 Abarrotes       08:00       22:00
## 4398 Abarrotes       08:00       22:00
## 4399 Abarrotes       08:00       22:00
## 4400 Abarrotes       08:00       22:00
## 4401 Abarrotes       08:00       22:00
## 4402 Abarrotes       08:00       22:00
## 4403 Abarrotes       08:00       22:00
## 4404 Abarrotes       08:00       22:00
## 4405 Abarrotes       08:00       22:00
## 4406 Abarrotes       08:00       22:00
## 4407 Abarrotes       08:00       22:00
## 4408 Abarrotes       08:00       22:00
## 4409 Abarrotes       08:00       22:00
## 4410 Abarrotes       08:00       22:00
## 4411 Abarrotes       08:00       22:00
## 4412 Abarrotes       08:00       22:00
## 4413 Abarrotes       08:00       22:00
## 4414 Abarrotes       08:00       22:00
## 4415 Abarrotes       08:00       22:00
## 4416 Abarrotes       08:00       22:00
## 4417 Abarrotes       08:00       22:00
## 4418 Abarrotes       08:00       22:00
## 4419 Abarrotes       08:00       22:00
## 4420 Abarrotes       08:00       22:00
## 4421 Abarrotes       08:00       22:00
## 4422 Abarrotes       08:00       22:00
## 4423 Abarrotes       08:00       22:00
## 4424 Abarrotes       08:00       22:00
## 4425 Abarrotes       08:00       22:00
## 4426 Abarrotes       08:00       22:00
## 4427 Abarrotes       08:00       22:00
## 4428 Abarrotes       08:00       22:00
## 4429 Abarrotes       08:00       22:00
## 4430 Abarrotes       08:00       22:00
## 4431 Abarrotes       08:00       22:00
## 4432 Abarrotes       08:00       22:00
## 4433 Abarrotes       08:00       22:00
## 4434 Abarrotes       08:00       22:00
## 4435 Abarrotes       08:00       22:00
## 4436 Abarrotes       08:00       22:00
## 4437 Abarrotes       08:00       22:00
## 4438 Abarrotes       08:00       22:00
## 4439 Abarrotes       08:00       22:00
## 4440 Abarrotes       08:00       22:00
## 4441 Abarrotes       08:00       22:00
## 4442 Abarrotes       08:00       22:00
## 4443 Abarrotes       08:00       22:00
## 4444 Abarrotes       08:00       22:00
## 4445 Abarrotes       08:00       22:00
## 4446 Abarrotes       08:00       22:00
## 4447 Abarrotes       08:00       22:00
## 4448 Abarrotes       08:00       22:00
## 4449 Abarrotes       08:00       22:00
## 4450 Abarrotes       08:00       22:00
## 4451 Abarrotes       08:00       22:00
## 4452 Abarrotes       08:00       22:00
## 4453 Abarrotes       08:00       22:00
## 4454 Abarrotes       08:00       22:00
## 4455 Abarrotes       08:00       22:00
## 4456 Abarrotes       08:00       22:00
## 4457 Abarrotes       08:00       22:00
## 4458 Abarrotes       08:00       22:00
## 4459 Abarrotes       08:00       22:00
## 4460 Abarrotes       08:00       22:00
## 4461 Abarrotes       08:00       22:00
## 4462 Abarrotes       08:00       22:00
## 4463 Abarrotes       08:00       22:00
## 4464 Abarrotes       08:00       22:00
## 4465 Abarrotes       08:00       22:00
## 4466 Abarrotes       08:00       22:00
## 4467 Abarrotes       08:00       22:00
## 4468 Abarrotes       08:00       22:00
## 4469 Abarrotes       08:00       22:00
## 4470 Abarrotes       08:00       22:00
## 4471 Abarrotes       08:00       22:00
## 4472 Abarrotes       08:00       22:00
## 4473 Abarrotes       08:00       22:00
## 4474 Abarrotes       08:00       22:00
## 4475 Abarrotes       08:00       22:00
## 4476 Abarrotes       08:00       22:00
## 4477 Abarrotes       08:00       22:00
## 4478 Abarrotes       08:00       22:00
## 4479 Abarrotes       08:00       22:00
## 4480 Abarrotes       08:00       22:00
## 4481 Abarrotes       08:00       22:00
## 4482 Abarrotes       08:00       22:00
## 4483 Abarrotes       08:00       22:00
## 4484 Abarrotes       08:00       22:00
## 4485 Abarrotes       08:00       22:00
## 4486 Abarrotes       08:00       22:00
## 4487 Abarrotes       08:00       22:00
## 4488 Abarrotes       08:00       22:00
## 4489 Abarrotes       08:00       22:00
## 4490 Abarrotes       08:00       22:00
## 4491 Abarrotes       08:00       22:00
## 4492 Abarrotes       08:00       22:00
## 4493 Abarrotes       08:00       22:00
## 4494 Abarrotes       08:00       22:00
## 4495 Abarrotes       08:00       22:00
## 4496 Abarrotes       08:00       22:00
## 4497 Abarrotes       08:00       22:00
## 4498 Abarrotes       08:00       22:00
## 4499 Abarrotes       08:00       22:00
## 4500 Abarrotes       08:00       22:00
## 4501 Abarrotes       08:00       22:00
## 4502 Abarrotes       08:00       22:00
## 4503 Abarrotes       08:00       22:00
## 4504 Abarrotes       08:00       22:00
## 4505 Abarrotes       08:00       22:00
## 4506 Abarrotes       08:00       22:00
## 4507 Abarrotes       08:00       22:00
## 4508 Abarrotes       08:00       22:00
## 4509 Abarrotes       08:00       22:00
## 4510 Abarrotes       08:00       22:00
## 4511 Abarrotes       08:00       22:00
## 4512 Abarrotes       08:00       22:00
## 4513 Abarrotes       08:00       22:00
## 4514 Abarrotes       08:00       22:00
## 4515 Abarrotes       08:00       22:00
## 4516 Abarrotes       08:00       22:00
## 4517 Abarrotes       08:00       22:00
## 4518 Abarrotes       08:00       22:00
## 4519 Abarrotes       08:00       22:00
## 4520 Abarrotes       08:00       22:00
## 4521 Abarrotes       08:00       22:00
## 4522 Abarrotes       08:00       22:00
## 4523 Abarrotes       08:00       22:00
## 4524 Abarrotes       08:00       22:00
## 4525 Abarrotes       08:00       22:00
## 4526 Abarrotes       08:00       22:00
## 4527 Abarrotes       08:00       22:00
## 4528 Abarrotes       08:00       22:00
## 4529 Abarrotes       08:00       22:00
## 4530 Abarrotes       08:00       22:00
## 4531 Abarrotes       08:00       22:00
## 4532 Abarrotes       08:00       22:00
## 4533 Abarrotes       08:00       22:00
## 4534 Abarrotes       08:00       22:00
## 4535 Abarrotes       08:00       22:00
## 4536 Abarrotes       08:00       22:00
## 4537 Abarrotes       08:00       22:00
## 4538 Abarrotes       08:00       22:00
## 4539 Abarrotes       08:00       22:00
## 4540 Abarrotes       08:00       22:00
## 4541 Abarrotes       08:00       22:00
## 4542 Abarrotes       08:00       22:00
## 4543 Abarrotes       08:00       22:00
## 4544 Abarrotes       08:00       22:00
## 4545 Abarrotes       08:00       22:00
## 4546 Abarrotes       08:00       22:00
## 4547 Abarrotes       08:00       22:00
## 4548 Abarrotes       08:00       22:00
## 4549 Abarrotes       08:00       22:00
## 4550 Abarrotes       08:00       22:00
## 4551 Abarrotes       08:00       22:00
## 4552 Abarrotes       08:00       22:00
## 4553 Abarrotes       08:00       22:00
## 4554 Abarrotes       08:00       22:00
## 4555 Abarrotes       08:00       22:00
## 4556 Abarrotes       08:00       22:00
## 4557 Abarrotes       08:00       22:00
## 4558 Abarrotes       08:00       22:00
## 4559 Abarrotes       08:00       22:00
## 4560 Abarrotes       08:00       22:00
## 4561 Abarrotes       08:00       22:00
## 4562 Abarrotes       08:00       22:00
## 4563 Abarrotes       08:00       22:00
## 4564 Abarrotes       08:00       22:00
## 4565 Abarrotes       08:00       22:00
## 4566 Abarrotes       08:00       22:00
## 4567 Abarrotes       08:00       22:00
## 4568 Abarrotes       08:00       22:00
## 4569 Abarrotes       08:00       22:00
## 4570 Abarrotes       08:00       22:00
## 4571 Abarrotes       08:00       22:00
## 4572 Abarrotes       08:00       22:00
## 4573 Abarrotes       08:00       22:00
## 4574 Abarrotes       08:00       22:00
## 4575 Abarrotes       08:00       22:00
## 4576 Abarrotes       08:00       22:00
## 4577 Abarrotes       08:00       22:00
## 4578 Abarrotes       08:00       22:00
## 4579 Abarrotes       08:00       22:00
## 4580 Abarrotes       08:00       22:00
## 4581 Abarrotes       08:00       22:00
## 4582 Abarrotes       08:00       22:00
## 4583 Abarrotes       08:00       22:00
## 4584 Abarrotes       08:00       22:00
## 4585 Abarrotes       08:00       22:00
## 4586 Abarrotes       08:00       22:00
## 4587 Abarrotes       08:00       22:00
## 4588 Abarrotes       08:00       22:00
## 4589 Abarrotes       08:00       22:00
## 4590 Abarrotes       08:00       22:00
## 4591 Abarrotes       08:00       22:00
## 4592 Abarrotes       08:00       22:00
## 4593 Abarrotes       08:00       22:00
## 4594 Abarrotes       08:00       22:00
## 4595 Abarrotes       08:00       22:00
## 4596 Abarrotes       08:00       22:00
## 4597 Abarrotes       08:00       22:00
## 4598 Abarrotes       08:00       22:00
## 4599 Abarrotes       08:00       22:00
## 4600 Abarrotes       08:00       22:00
## 4601 Abarrotes       08:00       22:00
## 4602 Abarrotes       08:00       22:00
## 4603 Abarrotes       08:00       22:00
## 4604 Abarrotes       08:00       22:00
## 4605 Abarrotes       08:00       22:00
## 4606 Abarrotes       08:00       22:00
## 4607 Abarrotes       08:00       22:00
## 4608 Abarrotes       08:00       22:00
## 4609 Abarrotes       08:00       22:00
## 4610 Abarrotes       08:00       22:00
## 4611 Abarrotes       08:00       22:00
## 4612 Abarrotes       08:00       22:00
## 4613 Abarrotes       08:00       22:00
## 4614 Abarrotes       08:00       22:00
## 4615 Abarrotes       08:00       22:00
## 4616 Abarrotes       08:00       22:00
## 4617 Abarrotes       08:00       22:00
## 4618 Abarrotes       08:00       22:00
## 4619 Abarrotes       08:00       22:00
## 4620 Abarrotes       08:00       22:00
## 4621 Abarrotes       08:00       22:00
## 4622 Abarrotes       08:00       22:00
## 4623 Abarrotes       08:00       22:00
## 4624 Abarrotes       08:00       22:00
## 4625 Abarrotes       08:00       22:00
## 4626 Abarrotes       08:00       22:00
## 4627 Abarrotes       08:00       22:00
## 4628 Abarrotes       08:00       22:00
## 4629 Abarrotes       08:00       22:00
## 4630 Abarrotes       08:00       22:00
## 4631 Abarrotes       08:00       22:00
## 4632 Abarrotes       08:00       22:00
## 4633 Abarrotes       08:00       22:00
## 4634 Abarrotes       08:00       22:00
## 4635 Abarrotes       08:00       22:00
## 4636 Abarrotes       08:00       22:00
## 4637 Abarrotes       08:00       22:00
## 4638 Abarrotes       08:00       22:00
## 4639 Abarrotes       08:00       22:00
## 4640 Abarrotes       08:00       22:00
## 4641 Abarrotes       08:00       22:00
## 4642 Abarrotes       08:00       22:00
## 4643 Abarrotes       08:00       22:00
## 4644 Abarrotes       08:00       22:00
## 4645 Abarrotes       08:00       22:00
## 4646 Abarrotes       08:00       22:00
## 4647 Abarrotes       08:00       22:00
## 4648 Abarrotes       08:00       22:00
## 4649 Abarrotes       08:00       22:00
## 4650 Abarrotes       08:00       22:00
## 4651 Abarrotes       08:00       22:00
## 4652 Abarrotes       08:00       22:00
## 4653 Abarrotes       08:00       22:00
## 4654 Abarrotes       08:00       22:00
## 4655 Abarrotes       08:00       22:00
## 4656 Abarrotes       08:00       22:00
## 4657 Abarrotes       08:00       22:00
## 4658 Abarrotes       08:00       22:00
## 4659 Abarrotes       08:00       22:00
## 4660 Abarrotes       08:00       22:00
## 4661 Abarrotes       08:00       22:00
## 4662 Abarrotes       08:00       22:00
## 4663 Abarrotes       08:00       22:00
## 4664 Abarrotes       08:00       22:00
## 4665 Abarrotes       08:00       22:00
## 4666 Abarrotes       08:00       22:00
## 4667 Abarrotes       08:00       22:00
## 4668 Abarrotes       08:00       22:00
## 4669 Abarrotes       08:00       22:00
## 4670 Abarrotes       08:00       22:00
## 4671 Abarrotes       08:00       22:00
## 4672 Abarrotes       08:00       22:00
## 4673 Abarrotes       08:00       22:00
## 4674 Abarrotes       08:00       22:00
## 4675 Abarrotes       08:00       22:00
## 4676 Abarrotes       08:00       22:00
## 4677 Abarrotes       08:00       22:00
## 4678 Abarrotes       08:00       22:00
## 4679 Abarrotes       08:00       22:00
## 4680 Abarrotes       08:00       22:00
## 4681 Abarrotes       08:00       22:00
## 4682 Abarrotes       08:00       22:00
## 4683 Abarrotes       08:00       22:00
## 4684 Abarrotes       08:00       22:00
## 4685 Abarrotes       08:00       22:00
## 4686 Abarrotes       08:00       22:00
## 4687 Abarrotes       08:00       22:00
## 4688 Abarrotes       08:00       22:00
## 4689 Abarrotes       08:00       22:00
## 4690 Abarrotes       08:00       22:00
## 4691 Abarrotes       08:00       22:00
## 4692 Abarrotes       08:00       22:00
## 4693 Abarrotes       08:00       22:00
## 4694 Abarrotes       08:00       22:00
## 4695 Abarrotes       08:00       22:00
## 4696 Abarrotes       08:00       22:00
## 4697 Abarrotes       08:00       22:00
## 4698 Abarrotes       08:00       22:00
## 4699 Abarrotes       08:00       22:00
## 4700 Abarrotes       08:00       22:00
## 4701 Abarrotes       08:00       22:00
## 4702 Abarrotes       08:00       22:00
## 4703 Abarrotes       08:00       22:00
## 4704 Abarrotes       08:00       22:00
## 4705 Abarrotes       08:00       22:00
## 4706 Abarrotes       08:00       22:00
## 4707 Abarrotes       08:00       22:00
## 4708 Abarrotes       08:00       22:00
## 4709 Abarrotes       08:00       22:00
## 4710 Abarrotes       08:00       22:00
## 4711 Abarrotes       08:00       22:00
## 4712 Abarrotes       08:00       22:00
## 4713 Abarrotes       08:00       22:00
## 4714 Abarrotes       08:00       22:00
## 4715 Abarrotes       08:00       22:00
## 4716 Abarrotes       08:00       22:00
## 4717 Abarrotes       08:00       22:00
## 4718 Abarrotes       08:00       22:00
## 4719 Abarrotes       08:00       22:00
## 4720 Abarrotes       08:00       22:00
## 4721 Abarrotes       08:00       22:00
## 4722 Abarrotes       08:00       22:00
## 4723 Abarrotes       08:00       22:00
## 4724 Abarrotes       08:00       22:00
## 4725 Abarrotes       08:00       22:00
## 4726 Abarrotes       08:00       22:00
## 4727 Abarrotes       08:00       22:00
## 4728 Abarrotes       08:00       22:00
## 4729 Abarrotes       08:00       22:00
## 4730 Abarrotes       08:00       22:00
## 4731 Abarrotes       08:00       22:00
## 4732 Abarrotes       08:00       22:00
## 4733 Abarrotes       08:00       22:00
## 4734 Abarrotes       08:00       22:00
## 4735 Abarrotes       08:00       22:00
## 4736 Abarrotes       08:00       22:00
## 4737 Abarrotes       08:00       22:00
## 4738 Abarrotes       08:00       22:00
## 4739 Abarrotes       08:00       22:00
## 4740 Abarrotes       08:00       22:00
## 4741 Abarrotes       08:00       22:00
## 4742 Abarrotes       08:00       22:00
## 4743 Abarrotes       08:00       22:00
## 4744 Abarrotes       08:00       22:00
## 4745 Abarrotes       08:00       22:00
## 4746 Abarrotes       08:00       22:00
## 4747 Abarrotes       08:00       22:00
## 4748 Abarrotes       08:00       22:00
## 4749 Abarrotes       08:00       22:00
## 4750 Abarrotes       08:00       22:00
## 4751 Abarrotes       08:00       22:00
## 4752 Abarrotes       08:00       22:00
## 4753 Abarrotes       08:00       22:00
## 4754 Abarrotes       08:00       22:00
## 4755 Abarrotes       08:00       22:00
## 4756 Abarrotes       08:00       22:00
## 4757 Abarrotes       08:00       22:00
## 4758 Abarrotes       08:00       22:00
## 4759 Abarrotes       08:00       22:00
## 4760 Abarrotes       08:00       22:00
## 4761 Abarrotes       08:00       22:00
## 4762 Abarrotes       08:00       22:00
## 4763 Abarrotes       08:00       22:00
## 4764 Abarrotes       08:00       22:00
## 4765 Abarrotes       08:00       22:00
## 4766 Abarrotes       08:00       22:00
## 4767 Abarrotes       08:00       22:00
## 4768 Abarrotes       08:00       22:00
## 4769 Abarrotes       08:00       22:00
## 4770 Abarrotes       08:00       22:00
## 4771 Abarrotes       08:00       22:00
## 4772 Abarrotes       08:00       22:00
## 4773 Abarrotes       08:00       22:00
## 4774 Abarrotes       08:00       22:00
## 4775 Abarrotes       08:00       22:00
## 4776 Abarrotes       08:00       22:00
## 4777 Abarrotes       08:00       22:00
## 4778 Abarrotes       08:00       22:00
## 4779 Abarrotes       08:00       22:00
## 4780 Abarrotes       08:00       22:00
## 4781 Abarrotes       08:00       22:00
## 4782 Abarrotes       08:00       22:00
## 4783 Abarrotes       08:00       22:00
## 4784 Abarrotes       08:00       22:00
## 4785 Abarrotes       08:00       22:00
## 4786 Abarrotes       08:00       22:00
## 4787 Abarrotes       08:00       22:00
## 4788 Abarrotes       08:00       22:00
## 4789 Abarrotes       08:00       22:00
## 4790 Abarrotes       08:00       22:00
## 4791 Abarrotes       08:00       22:00
## 4792 Abarrotes       08:00       22:00
## 4793 Abarrotes       08:00       22:00
## 4794 Abarrotes       08:00       22:00
## 4795 Abarrotes       08:00       22:00
## 4796 Abarrotes       08:00       22:00
## 4797 Abarrotes       08:00       22:00
## 4798 Abarrotes       08:00       22:00
## 4799 Abarrotes       08:00       22:00
## 4800 Abarrotes       08:00       22:00
## 4801 Abarrotes       08:00       22:00
## 4802 Abarrotes       08:00       22:00
## 4803 Abarrotes       08:00       22:00
## 4804 Abarrotes       08:00       22:00
## 4805 Abarrotes       08:00       22:00
## 4806 Abarrotes       08:00       22:00
## 4807 Abarrotes       08:00       22:00
## 4808 Abarrotes       08:00       22:00
## 4809 Abarrotes       08:00       22:00
## 4810 Abarrotes       08:00       22:00
## 4811 Abarrotes       08:00       22:00
## 4812 Abarrotes       08:00       22:00
## 4813 Abarrotes       08:00       22:00
## 4814 Abarrotes       08:00       22:00
## 4815 Abarrotes       08:00       22:00
## 4816 Abarrotes       08:00       22:00
## 4817 Abarrotes       08:00       22:00
## 4818 Abarrotes       08:00       22:00
## 4819 Abarrotes       08:00       22:00
## 4820 Abarrotes       08:00       22:00
## 4821 Abarrotes       08:00       22:00
## 4822 Abarrotes       08:00       22:00
## 4823 Abarrotes       08:00       22:00
## 4824 Abarrotes       08:00       22:00
## 4825 Abarrotes       08:00       22:00
## 4826 Abarrotes       08:00       22:00
## 4827 Abarrotes       08:00       22:00
## 4828 Abarrotes       08:00       22:00
## 4829 Abarrotes       08:00       22:00
## 4830 Abarrotes       08:00       22:00
## 4831 Abarrotes       08:00       22:00
## 4832 Abarrotes       08:00       22:00
## 4833 Abarrotes       08:00       22:00
## 4834 Abarrotes       08:00       22:00
## 4835 Abarrotes       08:00       22:00
## 4836 Abarrotes       08:00       22:00
## 4837 Abarrotes       08:00       22:00
## 4838 Abarrotes       08:00       22:00
## 4839 Abarrotes       08:00       22:00
## 4840 Abarrotes       08:00       22:00
## 4841 Abarrotes       08:00       22:00
## 4842 Abarrotes       08:00       22:00
## 4843 Abarrotes       08:00       22:00
## 4844 Abarrotes       08:00       22:00
## 4845 Abarrotes       08:00       22:00
## 4846 Abarrotes       08:00       22:00
## 4847 Abarrotes       08:00       22:00
## 4848 Abarrotes       08:00       22:00
## 4849 Abarrotes       08:00       22:00
## 4850 Abarrotes       08:00       22:00
## 4851 Abarrotes       08:00       22:00
## 4852 Abarrotes       08:00       22:00
## 4853 Abarrotes       08:00       22:00
## 4854 Abarrotes       08:00       22:00
## 4855 Abarrotes       08:00       22:00
## 4856 Abarrotes       08:00       22:00
## 4857 Abarrotes       08:00       22:00
## 4858 Abarrotes       08:00       22:00
## 4859 Abarrotes       08:00       22:00
## 4860 Abarrotes       08:00       22:00
## 4861 Abarrotes       08:00       22:00
## 4862 Abarrotes       08:00       22:00
## 4863 Abarrotes       08:00       22:00
## 4864 Abarrotes       08:00       22:00
## 4865 Abarrotes       08:00       22:00
## 4866 Abarrotes       08:00       22:00
## 4867 Abarrotes       08:00       22:00
## 4868 Abarrotes       08:00       22:00
## 4869 Abarrotes       08:00       22:00
## 4870 Abarrotes       08:00       22:00
## 4871 Abarrotes       08:00       22:00
## 4872 Abarrotes       08:00       22:00
## 4873 Abarrotes       08:00       22:00
## 4874 Abarrotes       08:00       22:00
## 4875 Abarrotes       08:00       22:00
## 4876 Abarrotes       08:00       22:00
## 4877 Abarrotes       08:00       22:00
## 4878 Abarrotes       08:00       22:00
## 4879 Abarrotes       08:00       22:00
## 4880 Abarrotes       08:00       22:00
## 4881 Abarrotes       08:00       22:00
## 4882 Abarrotes       08:00       22:00
## 4883 Abarrotes       08:00       22:00
## 4884 Abarrotes       08:00       22:00
## 4885 Abarrotes       08:00       22:00
## 4886 Abarrotes       08:00       22:00
## 4887 Abarrotes       08:00       22:00
## 4888 Abarrotes       08:00       22:00
## 4889 Abarrotes       08:00       22:00
## 4890 Abarrotes       08:00       22:00
## 4891 Abarrotes       08:00       22:00
## 4892 Abarrotes       08:00       22:00
## 4893 Abarrotes       08:00       22:00
## 4894 Abarrotes       08:00       22:00
## 4895 Abarrotes       08:00       22:00
## 4896 Abarrotes       08:00       22:00
## 4897 Abarrotes       08:00       22:00
## 4898 Abarrotes       08:00       22:00
## 4899 Abarrotes       08:00       22:00
## 4900 Abarrotes       08:00       22:00
## 4901 Abarrotes       08:00       22:00
## 4902 Abarrotes       08:00       22:00
## 4903 Abarrotes       08:00       22:00
## 4904 Abarrotes       08:00       22:00
## 4905 Abarrotes       08:00       22:00
## 4906 Abarrotes       08:00       22:00
## 4907 Abarrotes       08:00       22:00
## 4908 Abarrotes       08:00       22:00
## 4909 Abarrotes       08:00       22:00
## 4910 Abarrotes       08:00       22:00
## 4911 Abarrotes       08:00       22:00
## 4912 Abarrotes       08:00       22:00
## 4913 Abarrotes       08:00       22:00
## 4914 Abarrotes       08:00       22:00
## 4915 Abarrotes       08:00       22:00
## 4916 Abarrotes       08:00       22:00
## 4917 Abarrotes       08:00       22:00
## 4918 Abarrotes       08:00       22:00
## 4919 Abarrotes       08:00       22:00
## 4920 Abarrotes       08:00       22:00
## 4921 Abarrotes       08:00       22:00
## 4922 Abarrotes       08:00       22:00
## 4923 Abarrotes       08:00       22:00
## 4924 Abarrotes       08:00       22:00
## 4925 Abarrotes       08:00       22:00
## 4926 Abarrotes       08:00       22:00
## 4927 Abarrotes       08:00       22:00
## 4928 Abarrotes       08:00       22:00
## 4929 Abarrotes       08:00       22:00
## 4930 Abarrotes       08:00       22:00
## 4931 Abarrotes       08:00       22:00
## 4932 Abarrotes       08:00       22:00
## 4933 Abarrotes       08:00       22:00
## 4934 Abarrotes       08:00       22:00
## 4935 Abarrotes       08:00       22:00
## 4936 Abarrotes       08:00       22:00
## 4937 Abarrotes       08:00       22:00
## 4938 Abarrotes       08:00       22:00
## 4939 Abarrotes       08:00       22:00
## 4940 Abarrotes       08:00       22:00
## 4941 Abarrotes       08:00       22:00
## 4942 Abarrotes       08:00       22:00
## 4943 Abarrotes       08:00       22:00
## 4944 Abarrotes       08:00       22:00
## 4945 Abarrotes       08:00       22:00
## 4946 Abarrotes       08:00       22:00
## 4947 Abarrotes       08:00       22:00
## 4948 Abarrotes       08:00       22:00
## 4949 Abarrotes       08:00       22:00
## 4950 Abarrotes       08:00       22:00
## 4951 Abarrotes       08:00       22:00
## 4952 Abarrotes       08:00       22:00
## 4953 Abarrotes       08:00       22:00
## 4954 Abarrotes       08:00       22:00
## 4955 Abarrotes       08:00       22:00
## 4956 Abarrotes       08:00       22:00
## 4957 Abarrotes       08:00       22:00
## 4958 Abarrotes       08:00       22:00
## 4959 Abarrotes       08:00       22:00
## 4960 Abarrotes       08:00       22:00
## 4961 Abarrotes       08:00       22:00
## 4962 Abarrotes       08:00       22:00
## 4963 Abarrotes       08:00       22:00
## 4964 Abarrotes       08:00       22:00
## 4965 Abarrotes       08:00       22:00
## 4966 Abarrotes       08:00       22:00
## 4967 Abarrotes       08:00       22:00
## 4968 Abarrotes       08:00       22:00
## 4969 Abarrotes       08:00       22:00
## 4970 Abarrotes       08:00       22:00
## 4971 Abarrotes       08:00       22:00
## 4972 Abarrotes       08:00       22:00
## 4973 Abarrotes       08:00       22:00
## 4974 Abarrotes       08:00       22:00
## 4975 Abarrotes       08:00       22:00
## 4976 Abarrotes       08:00       22:00
## 4977 Abarrotes       08:00       22:00
## 4978 Abarrotes       08:00       22:00
## 4979 Abarrotes       08:00       22:00
## 4980 Abarrotes       08:00       22:00
## 4981 Abarrotes       08:00       22:00
## 4982 Abarrotes       08:00       22:00
## 4983 Abarrotes       08:00       22:00
## 4984 Abarrotes       08:00       22:00
## 4985 Abarrotes       08:00       22:00
## 4986 Abarrotes       08:00       22:00
## 4987 Abarrotes       08:00       22:00
## 4988 Abarrotes       08:00       22:00
## 4989 Abarrotes       08:00       22:00
## 4990 Abarrotes       08:00       22:00
## 4991 Abarrotes       08:00       22:00
## 4992 Abarrotes       08:00       22:00
## 4993 Abarrotes       08:00       22:00
## 4994 Abarrotes       08:00       22:00
## 4995 Abarrotes       08:00       22:00
## 4996 Abarrotes       08:00       22:00
## 4997 Abarrotes       08:00       22:00
## 4998 Abarrotes       08:00       22:00
## 4999 Abarrotes       08:00       22:00
##  [ reached 'max' / getOption("max.print") -- omitted 195474 rows ]

#Técnica 3. Resolver errores tipogréficos y similares

#Valores absolutos
bd4<-bd1
bd4<-abs(bd4$Precio)
summary(bd4)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    0.50   11.00   16.00   19.45   25.00 1000.00
#Unidades en enteros
bd5<-bd4
bd5["Unidades"] <- ceiling(bd5["Unidades"])
summary(bd5)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max.    NA's 
##    0.50   11.00   16.00   19.45   25.00 1000.00       1

#Técnica 4. Convertir tipos de datos

#Convertir caracter a fecha
bd6<-bd3
bd6$Fecha<-as.Date(bd6$Fecha, format="%d/%m/%Y")
tibble(bd6)
## # A tibble: 200,473 × 20
##    vcCla…¹ DescG…² Fecha      Hora  Marca Fabri…³ Produ…⁴ Precio Ult.C…⁵ Unida…⁶
##    <chr>   <chr>   <date>     <chr> <chr> <chr>   <chr>    <dbl>   <dbl>   <dbl>
##  1 MX001   Abarro… 2020-06-19 08:1… NUTR… MEXILAC Nutri …   16     12.3        1
##  2 MX001   Abarro… 2020-06-19 08:2… DAN … DANONE… DANUP …   14     14          1
##  3 MX001   Abarro… 2020-06-19 08:2… BIMBO GRUPO … Rebana…    5      5          1
##  4 MX001   Abarro… 2020-06-19 08:2… PEPSI PEPSI-… Pepsi …    8      8          1
##  5 MX001   Abarro… 2020-06-19 08:2… BLAN… FABRIC… Deterg…   19.5   15          1
##  6 MX001   Abarro… 2020-06-19 08:2… FLASH ALEN    Flash …    9.5    7.31       1
##  7 MX001   Abarro… 2020-06-19 08:2… VARI… DANONE… Danone…   11     11          1
##  8 MX001   Abarro… 2020-06-19 08:2… ZOTE  FABRIC… Jabon …    9.5    7.31       1
##  9 MX001   Abarro… 2020-06-19 08:2… ALWA… PROCTE… T Feme…   23.5   18.1        1
## 10 MX001   Abarro… 2020-06-19 15:2… JUMEX JUMEX   Jugo D…   12     12          1
## # … with 200,463 more rows, 10 more variables: F.Ticket <int>,
## #   NombreDepartamento <chr>, NombreFamilia <chr>, NombreCategoria <chr>,
## #   Estado <chr>, Mts.2 <int>, Tipo.ubicación <chr>, Giro <chr>,
## #   Hora.inicio <chr>, Hora.cierre <chr>, and abbreviated variable names
## #   ¹​vcClaveTienda, ²​DescGiro, ³​Fabricante, ⁴​Producto, ⁵​Ult.Costo, ⁶​Unidades
#Convertir caracter a entero
bd7<-bd6
bd7$Hora<-substr(bd7$Hora,start=1,stop=2)
tibble(bd7)
## # A tibble: 200,473 × 20
##    vcCla…¹ DescG…² Fecha      Hora  Marca Fabri…³ Produ…⁴ Precio Ult.C…⁵ Unida…⁶
##    <chr>   <chr>   <date>     <chr> <chr> <chr>   <chr>    <dbl>   <dbl>   <dbl>
##  1 MX001   Abarro… 2020-06-19 08    NUTR… MEXILAC Nutri …   16     12.3        1
##  2 MX001   Abarro… 2020-06-19 08    DAN … DANONE… DANUP …   14     14          1
##  3 MX001   Abarro… 2020-06-19 08    BIMBO GRUPO … Rebana…    5      5          1
##  4 MX001   Abarro… 2020-06-19 08    PEPSI PEPSI-… Pepsi …    8      8          1
##  5 MX001   Abarro… 2020-06-19 08    BLAN… FABRIC… Deterg…   19.5   15          1
##  6 MX001   Abarro… 2020-06-19 08    FLASH ALEN    Flash …    9.5    7.31       1
##  7 MX001   Abarro… 2020-06-19 08    VARI… DANONE… Danone…   11     11          1
##  8 MX001   Abarro… 2020-06-19 08    ZOTE  FABRIC… Jabon …    9.5    7.31       1
##  9 MX001   Abarro… 2020-06-19 08    ALWA… PROCTE… T Feme…   23.5   18.1        1
## 10 MX001   Abarro… 2020-06-19 15    JUMEX JUMEX   Jugo D…   12     12          1
## # … with 200,463 more rows, 10 more variables: F.Ticket <int>,
## #   NombreDepartamento <chr>, NombreFamilia <chr>, NombreCategoria <chr>,
## #   Estado <chr>, Mts.2 <int>, Tipo.ubicación <chr>, Giro <chr>,
## #   Hora.inicio <chr>, Hora.cierre <chr>, and abbreviated variable names
## #   ¹​vcClaveTienda, ²​DescGiro, ³​Fabricante, ⁴​Producto, ⁵​Ult.Costo, ⁶​Unidades
bd7$Hora <- as.integer(bd7$Hora)
str(bd7)
## 'data.frame':    200473 obs. of  20 variables:
##  $ vcClaveTienda     : chr  "MX001" "MX001" "MX001" "MX001" ...
##  $ DescGiro          : chr  "Abarrotes" "Abarrotes" "Abarrotes" "Abarrotes" ...
##  $ Fecha             : Date, format: "2020-06-19" "2020-06-19" ...
##  $ Hora              : int  8 8 8 8 8 8 8 8 8 15 ...
##  $ Marca             : chr  "NUTRI LECHE" "DAN UP" "BIMBO" "PEPSI" ...
##  $ Fabricante        : chr  "MEXILAC" "DANONE DE MEXICO" "GRUPO BIMBO" "PEPSI-COLA MEXICANA" ...
##  $ Producto          : chr  "Nutri Leche 1 Litro" "DANUP STRAWBERRY P/BEBER 350GR NAL" "Rebanadas Bimbo 2Pz" "Pepsi N.R. 400Ml" ...
##  $ Precio            : num  16 14 5 8 19.5 9.5 11 9.5 23.5 12 ...
##  $ Ult.Costo         : num  12.3 14 5 8 15 ...
##  $ Unidades          : num  1 1 1 1 1 1 1 1 1 1 ...
##  $ F.Ticket          : int  1 2 3 3 4 4 4 4 4 5 ...
##  $ NombreDepartamento: chr  "Abarrotes" "Abarrotes" "Abarrotes" "Abarrotes" ...
##  $ NombreFamilia     : chr  "Lacteos y Refrigerados" "Lacteos y Refrigerados" "Pan y Tortilla" "Bebidas" ...
##  $ NombreCategoria   : chr  "Leche" "Yogurt" "Pan Dulce Empaquetado" "Refrescos Plástico (N.R.)" ...
##  $ Estado            : chr  "Nuevo León" "Nuevo León" "Nuevo León" "Nuevo León" ...
##  $ Mts.2             : int  60 60 60 60 60 60 60 60 60 60 ...
##  $ Tipo.ubicación    : chr  "Esquina" "Esquina" "Esquina" "Esquina" ...
##  $ Giro              : chr  "Abarrotes" "Abarrotes" "Abarrotes" "Abarrotes" ...
##  $ Hora.inicio       : chr  "08:00" "08:00" "08:00" "08:00" ...
##  $ Hora.cierre       : chr  "22:00" "22:00" "22:00" "22:00" ...

#Técnica 5. Tratar valores faltantes (NA)

#Identificar cuántos NA hay en la base de datos
sum(is.na(bd7))
## [1] 0
sum(is.na(bd))
## [1] 199188
#Identificar cuántos NA hay por variable
sapply(bd,function(x)sum(is.na(x)))
##      vcClaveTienda           DescGiro      Codigo.Barras                PLU 
##                  0                  0                  0             199188 
##              Fecha               Hora              Marca         Fabricante 
##                  0                  0                  0                  0 
##           Producto             Precio          Ult.Costo           Unidades 
##                  0                  0                  0                  0 
##           F.Ticket NombreDepartamento      NombreFamilia    NombreCategoria 
##                  0                  0                  0                  0 
##             Estado              Mts.2     Tipo.ubicación               Giro 
##                  0                  0                  0                  0 
##        Hora.inicio        Hora.cierre 
##                  0                  0
#Borrar todos los registros NA de una tabla
bd8<-bd
bd8<-na.omit(bd8)
summary(bd8)
##  vcClaveTienda        DescGiro         Codigo.Barras            PLU        
##  Length:1437        Length:1437        Min.   :6.750e+08   Min.   : 1.000  
##  Class :character   Class :character   1st Qu.:6.750e+08   1st Qu.: 1.000  
##  Mode  :character   Mode  :character   Median :6.750e+08   Median : 1.000  
##                                        Mean   :2.616e+11   Mean   : 2.112  
##                                        3rd Qu.:6.750e+08   3rd Qu.: 1.000  
##                                        Max.   :7.501e+12   Max.   :30.000  
##     Fecha               Hora              Marca            Fabricante       
##  Length:1437        Length:1437        Length:1437        Length:1437       
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##    Producto             Precio        Ult.Costo        Unidades    
##  Length:1437        Min.   :30.00   Min.   : 1.00   Min.   :1.000  
##  Class :character   1st Qu.:90.00   1st Qu.:64.62   1st Qu.:1.000  
##  Mode  :character   Median :90.00   Median :64.62   Median :1.000  
##                     Mean   :87.94   Mean   :56.65   Mean   :1.124  
##                     3rd Qu.:90.00   3rd Qu.:64.62   3rd Qu.:1.000  
##                     Max.   :90.00   Max.   :64.62   Max.   :7.000  
##     F.Ticket      NombreDepartamento NombreFamilia      NombreCategoria   
##  Min.   :   772   Length:1437        Length:1437        Length:1437       
##  1st Qu.: 99955   Class :character   Class :character   Class :character  
##  Median :102493   Mode  :character   Mode  :character   Mode  :character  
##  Mean   :100595                                                           
##  3rd Qu.:106546                                                           
##  Max.   :118356                                                           
##     Estado              Mts.2       Tipo.ubicación         Giro          
##  Length:1437        Min.   :58.00   Length:1437        Length:1437       
##  Class :character   1st Qu.:58.00   Class :character   Class :character  
##  Mode  :character   Median :58.00   Mode  :character   Mode  :character  
##                     Mean   :58.07                                        
##                     3rd Qu.:58.00                                        
##                     Max.   :60.00                                        
##  Hora.inicio        Hora.cierre       
##  Length:1437        Length:1437       
##  Class :character   Class :character  
##  Mode  :character   Mode  :character  
##                                       
##                                       
## 
#Reemplazar NA por 0
bd9<-bd
bd9[is.na(bd9)]<-0
summary(bd9)
##  vcClaveTienda        DescGiro         Codigo.Barras            PLU          
##  Length:200625      Length:200625      Min.   :8.347e+05   Min.   : 0.00000  
##  Class :character   Class :character   1st Qu.:7.501e+12   1st Qu.: 0.00000  
##  Mode  :character   Mode  :character   Median :7.501e+12   Median : 0.00000  
##                                        Mean   :5.950e+12   Mean   : 0.01513  
##                                        3rd Qu.:7.501e+12   3rd Qu.: 0.00000  
##                                        Max.   :1.750e+13   Max.   :30.00000  
##     Fecha               Hora              Marca            Fabricante       
##  Length:200625      Length:200625      Length:200625      Length:200625     
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##    Producto             Precio          Ult.Costo         Unidades     
##  Length:200625      Min.   :-147.00   Min.   :  0.38   Min.   : 0.200  
##  Class :character   1st Qu.:  11.00   1st Qu.:  8.46   1st Qu.: 1.000  
##  Mode  :character   Median :  16.00   Median : 12.31   Median : 1.000  
##                     Mean   :  19.42   Mean   : 15.31   Mean   : 1.262  
##                     3rd Qu.:  25.00   3rd Qu.: 19.23   3rd Qu.: 1.000  
##                     Max.   :1000.00   Max.   :769.23   Max.   :96.000  
##     F.Ticket      NombreDepartamento NombreFamilia      NombreCategoria   
##  Min.   :     1   Length:200625      Length:200625      Length:200625     
##  1st Qu.: 33964   Class :character   Class :character   Class :character  
##  Median :105993   Mode  :character   Mode  :character   Mode  :character  
##  Mean   :193990                                                           
##  3rd Qu.:383005                                                           
##  Max.   :450040                                                           
##     Estado              Mts.2      Tipo.ubicación         Giro          
##  Length:200625      Min.   :47.0   Length:200625      Length:200625     
##  Class :character   1st Qu.:53.0   Class :character   Class :character  
##  Mode  :character   Median :60.0   Mode  :character   Mode  :character  
##                     Mean   :56.6                                        
##                     3rd Qu.:60.0                                        
##                     Max.   :62.0                                        
##  Hora.inicio        Hora.cierre       
##  Length:200625      Length:200625     
##  Class :character   Class :character  
##  Mode  :character   Mode  :character  
##                                       
##                                       
## 
#Reemplazar NA con el promedio
bd10<-bd
bd10$PLU[is.na(bd10$PLU)] <- mean(bd10$PLU, na.rm=TRUE)
summary(bd10)
##  vcClaveTienda        DescGiro         Codigo.Barras            PLU        
##  Length:200625      Length:200625      Min.   :8.347e+05   Min.   : 1.000  
##  Class :character   Class :character   1st Qu.:7.501e+12   1st Qu.: 2.112  
##  Mode  :character   Mode  :character   Median :7.501e+12   Median : 2.112  
##                                        Mean   :5.950e+12   Mean   : 2.112  
##                                        3rd Qu.:7.501e+12   3rd Qu.: 2.112  
##                                        Max.   :1.750e+13   Max.   :30.000  
##     Fecha               Hora              Marca            Fabricante       
##  Length:200625      Length:200625      Length:200625      Length:200625     
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##    Producto             Precio          Ult.Costo         Unidades     
##  Length:200625      Min.   :-147.00   Min.   :  0.38   Min.   : 0.200  
##  Class :character   1st Qu.:  11.00   1st Qu.:  8.46   1st Qu.: 1.000  
##  Mode  :character   Median :  16.00   Median : 12.31   Median : 1.000  
##                     Mean   :  19.42   Mean   : 15.31   Mean   : 1.262  
##                     3rd Qu.:  25.00   3rd Qu.: 19.23   3rd Qu.: 1.000  
##                     Max.   :1000.00   Max.   :769.23   Max.   :96.000  
##     F.Ticket      NombreDepartamento NombreFamilia      NombreCategoria   
##  Min.   :     1   Length:200625      Length:200625      Length:200625     
##  1st Qu.: 33964   Class :character   Class :character   Class :character  
##  Median :105993   Mode  :character   Mode  :character   Mode  :character  
##  Mean   :193990                                                           
##  3rd Qu.:383005                                                           
##  Max.   :450040                                                           
##     Estado              Mts.2      Tipo.ubicación         Giro          
##  Length:200625      Min.   :47.0   Length:200625      Length:200625     
##  Class :character   1st Qu.:53.0   Class :character   Class :character  
##  Mode  :character   Median :60.0   Mode  :character   Mode  :character  
##                     Mean   :56.6                                        
##                     3rd Qu.:60.0                                        
##                     Max.   :62.0                                        
##  Hora.inicio        Hora.cierre       
##  Length:200625      Length:200625     
##  Class :character   Class :character  
##  Mode  :character   Mode  :character  
##                                       
##                                       
## 

#Técnica 6. Verificación datos con métodos estadísticos

bd11 <- bd7
boxplot(bd11$Precio, horizontal=TRUE)

boxplot(bd11$Unidades, horizontal=TRUE)

Paso 5. Manipular bases de datos

#Agregar columnas
bd11$diadelasemana <- wday(bd11$Fecha)
summary(bd11)
##  vcClaveTienda        DescGiro             Fecha                 Hora      
##  Length:200473      Length:200473      Min.   :2020-05-01   Min.   : 0.00  
##  Class :character   Class :character   1st Qu.:2020-06-06   1st Qu.:13.00  
##  Mode  :character   Mode  :character   Median :2020-07-11   Median :17.00  
##                                        Mean   :2020-07-18   Mean   :16.23  
##                                        3rd Qu.:2020-08-29   3rd Qu.:20.00  
##                                        Max.   :2020-11-11   Max.   :23.00  
##     Marca            Fabricante          Producto             Precio       
##  Length:200473      Length:200473      Length:200473      Min.   :   0.50  
##  Class :character   Class :character   Class :character   1st Qu.:  11.00  
##  Mode  :character   Mode  :character   Mode  :character   Median :  16.00  
##                                                           Mean   :  19.45  
##                                                           3rd Qu.:  25.00  
##                                                           Max.   :1000.00  
##    Ult.Costo         Unidades         F.Ticket      NombreDepartamento
##  Min.   :  0.38   Min.   : 0.200   Min.   :     1   Length:200473     
##  1st Qu.:  8.46   1st Qu.: 1.000   1st Qu.: 33978   Class :character  
##  Median : 12.31   Median : 1.000   Median :106035   Mode  :character  
##  Mean   : 15.31   Mean   : 1.261   Mean   :194101                     
##  3rd Qu.: 19.23   3rd Qu.: 1.000   3rd Qu.:383065                     
##  Max.   :769.23   Max.   :96.000   Max.   :450040                     
##  NombreFamilia      NombreCategoria       Estado              Mts.2     
##  Length:200473      Length:200473      Length:200473      Min.   :47.0  
##  Class :character   Class :character   Class :character   1st Qu.:53.0  
##  Mode  :character   Mode  :character   Mode  :character   Median :60.0  
##                                                           Mean   :56.6  
##                                                           3rd Qu.:60.0  
##                                                           Max.   :62.0  
##  Tipo.ubicación         Giro           Hora.inicio        Hora.cierre       
##  Length:200473      Length:200473      Length:200473      Length:200473     
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##  diadelasemana  
##  Min.   :1.000  
##  1st Qu.:2.000  
##  Median :4.000  
##  Mean   :3.911  
##  3rd Qu.:6.000  
##  Max.   :7.000
bd11$subtotal <- bd11$Precio * bd11$Unidades
summary(bd11)
##  vcClaveTienda        DescGiro             Fecha                 Hora      
##  Length:200473      Length:200473      Min.   :2020-05-01   Min.   : 0.00  
##  Class :character   Class :character   1st Qu.:2020-06-06   1st Qu.:13.00  
##  Mode  :character   Mode  :character   Median :2020-07-11   Median :17.00  
##                                        Mean   :2020-07-18   Mean   :16.23  
##                                        3rd Qu.:2020-08-29   3rd Qu.:20.00  
##                                        Max.   :2020-11-11   Max.   :23.00  
##     Marca            Fabricante          Producto             Precio       
##  Length:200473      Length:200473      Length:200473      Min.   :   0.50  
##  Class :character   Class :character   Class :character   1st Qu.:  11.00  
##  Mode  :character   Mode  :character   Mode  :character   Median :  16.00  
##                                                           Mean   :  19.45  
##                                                           3rd Qu.:  25.00  
##                                                           Max.   :1000.00  
##    Ult.Costo         Unidades         F.Ticket      NombreDepartamento
##  Min.   :  0.38   Min.   : 0.200   Min.   :     1   Length:200473     
##  1st Qu.:  8.46   1st Qu.: 1.000   1st Qu.: 33978   Class :character  
##  Median : 12.31   Median : 1.000   Median :106035   Mode  :character  
##  Mean   : 15.31   Mean   : 1.261   Mean   :194101                     
##  3rd Qu.: 19.23   3rd Qu.: 1.000   3rd Qu.:383065                     
##  Max.   :769.23   Max.   :96.000   Max.   :450040                     
##  NombreFamilia      NombreCategoria       Estado              Mts.2     
##  Length:200473      Length:200473      Length:200473      Min.   :47.0  
##  Class :character   Class :character   Class :character   1st Qu.:53.0  
##  Mode  :character   Mode  :character   Mode  :character   Median :60.0  
##                                                           Mean   :56.6  
##                                                           3rd Qu.:60.0  
##                                                           Max.   :62.0  
##  Tipo.ubicación         Giro           Hora.inicio        Hora.cierre       
##  Length:200473      Length:200473      Length:200473      Length:200473     
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##  diadelasemana      subtotal     
##  Min.   :1.000   Min.   :   1.0  
##  1st Qu.:2.000   1st Qu.:  12.0  
##  Median :4.000   Median :  18.0  
##  Mean   :3.911   Mean   :  24.3  
##  3rd Qu.:6.000   3rd Qu.:  27.0  
##  Max.   :7.000   Max.   :2496.0

Paso 6. Exportar base de datos limpia

bd_limpia <-bd11
write.csv(bd_limpia, file="abarrotes_bdlimpia.csv", row.names=FALSE)
LS0tDQp0aXRsZTogIkFiYXJyb3RlcyINCmF1dGhvcjogIkF2cmlsIExvYmF0byAtIEEwMDgzMzExMyINCmRhdGU6ICIyMDIzLTAzLTE3Ig0Kb3V0cHV0OiANCiAgaHRtbF9kb2N1bWVudDoNCiAgICB0b2M6IHRydWUNCiAgICB0b2NfZmxvYXQ6IHRydWUNCiAgICBjb2RlX2Rvd25sb2FkOiB0cnVlDQotLS0NCioqQW7DoWxpc2lzIGRlIGxhcyB2ZW50YXMgZW4gYWJhcnJvdGVzKiogIA0KPGltZyBzcmM9IkM6XFxVc2Vyc1xcQVZSSUxcXFBpY3R1cmVzXFxJTUFHRU5fU09MSUNJVEFEQV9NZXNhX2RlX3RyYWJham9fMS5qcGciPg0KDQpVbmEgZW1wcmVzYSBjb24gdGllbmRhcyBlbiBlbCBwYWlzIHNvbGljaXRhIHVuIGFuYWxpc2lzIGRlIHN1cyB2ZW50YXMgZGUgYWJhcnJvdGVzIGVudHJlIG1heW8geSBub3ZpZW1icmUgZGUgMjAyMA0KDQpfUGFzbyAwLiBJbnN0YWxhciBwYXF1ZXRlcyB5IGxsYW1hciBsaWJyZXJpYXNfDQpgYGB7cn0NCmxpYnJhcnkoZHBseXIpDQpsaWJyYXJ5KHRpZHl2ZXJzZSkNCmxpYnJhcnkoamFuaXRvcikNCmxpYnJhcnkobHVicmlkYXRlKQ0KYGBgDQoNCl9QYXNvIDEuIEltcG9ydGFyIGJhc2UgZGUgZGF0b3NfDQpgYGB7cn0NCmJkPC1yZWFkLmNzdigiQzpcXFVzZXJzXFxBVlJJTFxcRG93bmxvYWRzXFxhYmFycm90ZXMuY3N2IikNCmBgYA0KDQpfUGFzbyAyLiBFbnRlbmRlciBsYSBiYXNlIGRlIGRhdG9zXw0KYGBge3J9DQpzdW1tYXJ5KGJkKQ0KI2NvdW50KGJkLHZjQ2xhdmVUaWVuZGEsc29ydD1UUlVFKQ0KI2NvdW50KGJkLERlc0dpcm8sc29ydD1UUlVFKQ0KI2NvdW50KGJkLE1hcmNhLHNvcnQ9VFJVRSkNCiNjb3VudChiZCxGYWJyaWNhbnRlLHNvcnQ9VFJVRSkNCiNjb3VudChiZCxQcm9kdWN0byxzb3J0PVRSVUUpDQojY291bnQoYmQsTm9tYnJlRGVwYXJ0YW1lbnRvLHNvcnQ9VFJVRSkNCiNjb3VudChiZCxOb21icmVGYW1pbGlhLHNvcnQ9VFJVRSkNCiNjb3VudChiZCxOb21icmVDYXRlZ29yaWEsc29ydD1UUlVFKQ0KI2NvdW50KGJkLEVzdGFkbyxzb3J0PVRSVUUpDQojY291bnQoYmQsVGlwby51YmljYWNpw7NuLHNvcnQ9VFJVRSkNCiNjb3VudChiZCxHaXJvLHNvcnQ9VFJVRSkNCiNjb3VudChiZCxIb3JhLmluaWNpbyxzb3J0PVRSVUUpDQojY291bnQoYmQsSG9yYS5jaWVycmUsc29ydD1UUlVFKQ0KYGBgDQoNCl9QYXNvIDMuIEhhY2VyIHJlc3VtZW5lcyBkZSB0YWJsYSAoYSBwYXJ0aXIgZGUgdW5hIHRhYmxhIGNyZWFyIG90cmEgbnVldmEpXw0KYGBge3J9DQp0aWJibGUoYmQpDQpoZWFkKGJkKQ0KdGFpbChiZCxuPTcpDQoNCnRhYnlsKGJkLHZjQ2xhdmVUaWVuZGEsTm9tYnJlRGVwYXJ0YW1lbnRvKQ0KdGFieWwoYmQsTm9tYnJlRmFtaWxpYSx2Y0NsYXZlVGllbmRhKQ0KYGBgDQoNCl9IYWxsYXpnb3NfICANCjEuRmVjaGFzIHkgaG9yYXMgZXN0YW4gZW4gZm9ybWF0byBkZSBjYXJhY3RlciAgDQoyLkhheSBwcmVjaW9zIG5lZ2F0aXZvcyAgDQozLk5vIGhheSBjb2x1bW5hIGRlIHZlbnRhcyAgDQoNCl9QYXNvIDQuIExpbXBpYXIgbGEgYmFzZSBkZSBkYXRvc18gIA0KRXhpc3RlbiA2IHTDqWNuaWNhcyBwYXJhIGxpbXBpYXIgZGF0b3MgIA0KDQojVMOpY25pY2EgMS4gUmVtb3ZlciB2YWxvcmVzIGlycmVsZXZhbnRlcyANCmBgYHtyfQ0KI0VsaW1pbmFyIGNvbHVtbmFzDQpiZDE8LWJkDQpiZDE8LXN1YnNldChiZDEsc2VsZWN0PS1jKFBMVSxDb2RpZ28uQmFycmFzKSkNCmBgYA0KDQpgYGB7cn0NCiNFbGltaW5hciByZW5nbG9uZXMNCmJkMjwtYmQxDQpiZDI8LWJkMltiZDIkUHJlY2lvPjAsXQ0Kc3VtbWFyeShiZDIpDQpgYGANCg0KI1TDqWNuaWNhIDIuIFJlbW92ZXIgdmFsb3JlcyBkdXBsaWNhZG9zDQpgYGB7cn0NCiNJZGVudGlmaWNhciByZW5nbG9uZXMgZHVwbGljYWRvcw0KYmQyW2R1cGxpY2F0ZWQoYmQyKSxdDQpzdW0oZHVwbGljYXRlZChiZDIpKQ0KYGBgDQpgYGB7cn0NCiNFbGltaW5hciByZW5nbG9uZXMgZHVwbGljYWRvcw0KYmQzPC1iZDINCmJkMzwtZGlzdGluY3QoYmQzKQ0KYmQzDQpgYGANCg0KI1TDqWNuaWNhIDMuIFJlc29sdmVyIGVycm9yZXMgdGlwb2dyw6lmaWNvcyB5IHNpbWlsYXJlcw0KYGBge3J9DQojVmFsb3JlcyBhYnNvbHV0b3MNCmJkNDwtYmQxDQpiZDQ8LWFicyhiZDQkUHJlY2lvKQ0Kc3VtbWFyeShiZDQpDQpgYGANCg0KYGBge3J9DQojVW5pZGFkZXMgZW4gZW50ZXJvcw0KYmQ1PC1iZDQNCmJkNVsiVW5pZGFkZXMiXSA8LSBjZWlsaW5nKGJkNVsiVW5pZGFkZXMiXSkNCnN1bW1hcnkoYmQ1KQ0KYGBgDQoNCiNUw6ljbmljYSA0LiBDb252ZXJ0aXIgdGlwb3MgZGUgZGF0b3MNCmBgYHtyfQ0KI0NvbnZlcnRpciBjYXJhY3RlciBhIGZlY2hhDQpiZDY8LWJkMw0KYmQ2JEZlY2hhPC1hcy5EYXRlKGJkNiRGZWNoYSwgZm9ybWF0PSIlZC8lbS8lWSIpDQp0aWJibGUoYmQ2KQ0KDQojQ29udmVydGlyIGNhcmFjdGVyIGEgZW50ZXJvDQpiZDc8LWJkNg0KYmQ3JEhvcmE8LXN1YnN0cihiZDckSG9yYSxzdGFydD0xLHN0b3A9MikNCnRpYmJsZShiZDcpDQpiZDckSG9yYSA8LSBhcy5pbnRlZ2VyKGJkNyRIb3JhKQ0Kc3RyKGJkNykNCmBgYA0KDQojVMOpY25pY2EgNS4gVHJhdGFyIHZhbG9yZXMgZmFsdGFudGVzIChOQSkNCmBgYHtyfQ0KI0lkZW50aWZpY2FyIGN1w6FudG9zIE5BIGhheSBlbiBsYSBiYXNlIGRlIGRhdG9zDQpzdW0oaXMubmEoYmQ3KSkNCnN1bShpcy5uYShiZCkpDQoNCiNJZGVudGlmaWNhciBjdcOhbnRvcyBOQSBoYXkgcG9yIHZhcmlhYmxlDQpzYXBwbHkoYmQsZnVuY3Rpb24oeClzdW0oaXMubmEoeCkpKQ0KDQojQm9ycmFyIHRvZG9zIGxvcyByZWdpc3Ryb3MgTkEgZGUgdW5hIHRhYmxhDQpiZDg8LWJkDQpiZDg8LW5hLm9taXQoYmQ4KQ0Kc3VtbWFyeShiZDgpDQoNCiNSZWVtcGxhemFyIE5BIHBvciAwDQpiZDk8LWJkDQpiZDlbaXMubmEoYmQ5KV08LTANCnN1bW1hcnkoYmQ5KQ0KDQojUmVlbXBsYXphciBOQSBjb24gZWwgcHJvbWVkaW8NCmJkMTA8LWJkDQpiZDEwJFBMVVtpcy5uYShiZDEwJFBMVSldIDwtIG1lYW4oYmQxMCRQTFUsIG5hLnJtPVRSVUUpDQpzdW1tYXJ5KGJkMTApDQpgYGANCg0KI1TDqWNuaWNhIDYuIFZlcmlmaWNhY2nDs24gZGF0b3MgY29uIG3DqXRvZG9zIGVzdGFkw61zdGljb3MNCmBgYHtyfQ0KYmQxMSA8LSBiZDcNCmJveHBsb3QoYmQxMSRQcmVjaW8sIGhvcml6b250YWw9VFJVRSkNCmJveHBsb3QoYmQxMSRVbmlkYWRlcywgaG9yaXpvbnRhbD1UUlVFKQ0KYGBgDQoNCl9QYXNvIDUuIE1hbmlwdWxhciBiYXNlcyBkZSBkYXRvc18NCmBgYHtyfQ0KI0FncmVnYXIgY29sdW1uYXMNCmJkMTEkZGlhZGVsYXNlbWFuYSA8LSB3ZGF5KGJkMTEkRmVjaGEpDQpzdW1tYXJ5KGJkMTEpDQoNCmJkMTEkc3VidG90YWwgPC0gYmQxMSRQcmVjaW8gKiBiZDExJFVuaWRhZGVzDQpzdW1tYXJ5KGJkMTEpDQpgYGANCg0KX1Bhc28gNi4gRXhwb3J0YXIgYmFzZSBkZSBkYXRvcyBsaW1waWFfDQpgYGB7cn0NCmJkX2xpbXBpYSA8LWJkMTENCndyaXRlLmNzdihiZF9saW1waWEsIGZpbGU9ImFiYXJyb3Rlc19iZGxpbXBpYS5jc3YiLCByb3cubmFtZXM9RkFMU0UpDQpgYGANCg==